Module Typedecl_separability

type error =
  1. | Non_separable_evar of string option
exception Error of Location.t * error
type mode = Types.Separability.t =
  1. | Ind
  2. | Sep
  3. | Deepsep
val compute_decl : Env.t -> Types.type_declaration -> mode list
val property : (prop, unit) Typedecl_properties.property
val update_decls : Env.t -> (Ident.t * Typedecl_properties.decl) list -> (Ident.t * Typedecl_properties.decl) list