Printtyp
val longident : Format.formatter -> Longident.t -> unit
val ident : Format.formatter -> Ident.t -> unit
val tree_of_path : Path.t -> Outcometree.out_ident
val path : Format.formatter -> Path.t -> unit
val string_of_path : Path.t -> string
val type_path : Format.formatter -> Path.t -> unit
module Out_name : sig ... end
val raw_type_expr : Format.formatter -> Types.type_expr -> unit
val string_of_label : Asttypes.arg_label -> string
val wrap_printing_env : error:bool -> Env.t -> (unit -> 'a) -> 'a
module Naming_context : sig ... end
module Conflicts : sig ... end
val type_expr : Format.formatter -> Types.type_expr -> unit
val prepare_for_printing : Types.type_expr list -> unit
val add_type_to_preparation : Types.type_expr -> unit
val prepared_type_expr : Format.formatter -> Types.type_expr -> unit
val constructor_arguments :
Format.formatter ->
Types.constructor_arguments ->
unit
val tree_of_type_scheme : Types.type_expr -> Outcometree.out_type
val type_scheme : Format.formatter -> Types.type_expr -> unit
val tree_of_value_description :
Ident.t ->
Types.value_description ->
Outcometree.out_sig_item
val value_description :
Ident.t ->
Format.formatter ->
Types.value_description ->
unit
val label : Format.formatter -> Types.label_declaration -> unit
val constructor : Format.formatter -> Types.constructor_declaration -> unit
val tree_of_type_declaration :
Ident.t ->
Types.type_declaration ->
Types.rec_status ->
Outcometree.out_sig_item
val type_declaration :
Ident.t ->
Format.formatter ->
Types.type_declaration ->
unit
val tree_of_extension_constructor :
Ident.t ->
Types.extension_constructor ->
Types.ext_status ->
Outcometree.out_sig_item
val extension_constructor :
Ident.t ->
Format.formatter ->
Types.extension_constructor ->
unit
val extension_only_constructor :
Ident.t ->
Format.formatter ->
Types.extension_constructor ->
unit
val tree_of_module :
Ident.t ->
?ellipsis:bool ->
Types.module_type ->
Types.rec_status ->
Outcometree.out_sig_item
val modtype : Format.formatter -> Types.module_type -> unit
val signature : Format.formatter -> Types.signature -> unit
val tree_of_modtype : Types.module_type -> Outcometree.out_module_type
val tree_of_modtype_declaration :
Ident.t ->
Types.modtype_declaration ->
Outcometree.out_sig_item
val functor_parameters :
sep:(Format.formatter -> unit -> unit) ->
('b -> Format.formatter -> unit) ->
(Ident.t option * 'b) list ->
Format.formatter ->
unit
val tree_of_signature : Types.signature -> Outcometree.out_sig_item list
val tree_of_typexp : type_or_scheme -> Types.type_expr -> Outcometree.out_type
val modtype_declaration :
Ident.t ->
Format.formatter ->
Types.modtype_declaration ->
unit
val class_type : Format.formatter -> Types.class_type -> unit
val tree_of_class_declaration :
Ident.t ->
Types.class_declaration ->
Types.rec_status ->
Outcometree.out_sig_item
val class_declaration :
Ident.t ->
Format.formatter ->
Types.class_declaration ->
unit
val tree_of_cltype_declaration :
Ident.t ->
Types.class_type_declaration ->
Types.rec_status ->
Outcometree.out_sig_item
val cltype_declaration :
Ident.t ->
Format.formatter ->
Types.class_type_declaration ->
unit
val type_expansion :
type_or_scheme ->
Format.formatter ->
Errortrace.expanded_type ->
unit
val prepare_expansion : Errortrace.expanded_type -> Errortrace.expanded_type
val report_ambiguous_type_error :
Format.formatter ->
Env.t ->
(Path.t * Path.t) ->
(Path.t * Path.t) list ->
(Format.formatter -> unit) ->
(Format.formatter -> unit) ->
(Format.formatter -> unit) ->
unit
val report_unification_error :
Format.formatter ->
Env.t ->
Errortrace.unification_error ->
?type_expected_explanation:(Format.formatter -> unit) ->
(Format.formatter -> unit) ->
(Format.formatter -> unit) ->
unit
val report_equality_error :
Format.formatter ->
type_or_scheme ->
Env.t ->
Errortrace.equality_error ->
(Format.formatter -> unit) ->
(Format.formatter -> unit) ->
unit
val report_moregen_error :
Format.formatter ->
type_or_scheme ->
Env.t ->
Errortrace.moregen_error ->
(Format.formatter -> unit) ->
(Format.formatter -> unit) ->
unit
val report_comparison_error :
Format.formatter ->
type_or_scheme ->
Env.t ->
Errortrace.comparison_error ->
(Format.formatter -> unit) ->
(Format.formatter -> unit) ->
unit
module Subtype : sig ... end
val print_items :
(Env.t -> Types.signature_item -> 'a option) ->
Env.t ->
Types.signature_item list ->
(Outcometree.out_sig_item * 'a option) list
val printed_signature : string -> Format.formatter -> Types.signature -> unit