Module Includecore
type type_mismatch
=
|
Arity
|
Privacy
|
Kind
|
Constraint
|
Manifest
|
Variance
|
Field_type of Ident.t
|
Field_mutable of Ident.t
|
Field_arity of Ident.t
|
Field_names of int * Ident.t * Ident.t
|
Field_missing of bool * Ident.t
|
Record_representation of bool
|
Unboxed_representation of bool
|
Immediate
val value_descriptions : loc:Location.t -> Env.t -> string -> Types.value_description -> Types.value_description -> Typedtree.module_coercion
val type_declarations : ?equality:bool -> loc:Location.t -> Env.t -> mark:bool -> string -> Types.type_declaration -> Ident.t -> Types.type_declaration -> type_mismatch option
val extension_constructors : loc:Location.t -> Env.t -> mark:bool -> Ident.t -> Types.extension_constructor -> Types.extension_constructor -> type_mismatch option
val report_type_mismatch : string -> string -> string -> Stdlib.Format.formatter -> type_mismatch -> unit