Typetexp
val transl_simple_type : Env.t -> bool -> Parsetree.core_type -> Typedtree.core_type
val transl_simple_type_univars : Env.t -> Parsetree.core_type -> Typedtree.core_type
val transl_simple_type_delayed : Env.t -> Parsetree.core_type -> Typedtree.core_type * Types.type_expr * (unit -> unit)
val transl_type_scheme : Env.t -> Parsetree.core_type -> Typedtree.core_type
val type_variable : Location.t -> string -> Types.type_expr
val transl_type_param : Env.t -> Parsetree.core_type -> Typedtree.core_type
val narrow : unit -> variable_context
val widen : variable_context -> unit
type error =
| Unbound_type_variable of string |
| Undefined_type_constructor of Path.t |
| Type_arity_mismatch of Longident.t * int * int |
| Bound_type_variable of string |
| Recursive_type |
| Unbound_row_variable of Longident.t |
| Type_mismatch of Ctype.Unification_trace.t |
| Alias_type_mismatch of Ctype.Unification_trace.t |
| Present_has_conjunction of string |
| Present_has_no_type of string |
| Constructor_mismatch of Types.type_expr * Types.type_expr |
| Not_a_variant of Types.type_expr |
| Variant_tags of string * string |
| Invalid_variable_name of string |
| Cannot_quantify of string * Types.type_expr |
| Multiple_constraints_on_type of Longident.t |
| Method_mismatch of string * Types.type_expr * Types.type_expr |
| Opened_object of Path.t option |
| Not_an_object of Types.type_expr |
exception Error of Location.t * Env.t * error
val report_error : Env.t -> Format.formatter -> error -> unit
val transl_modtype_longident : (Location.t -> Env.t -> Longident.t -> Path.t) ref
val transl_modtype : (Env.t -> Parsetree.module_type -> Typedtree.module_type) ref
val create_package_mty : Location.t -> Env.t -> Parsetree.package_type -> (Longident.t Asttypes.loc * Parsetree.core_type) list * Parsetree.module_type