Module Printtyp
val longident : Stdlib.Format.formatter -> Longident.t -> unitval ident : Stdlib.Format.formatter -> Ident.t -> unitval tree_of_path : Path.t -> Outcometree.out_identval path : Stdlib.Format.formatter -> Path.t -> unitval string_of_path : Path.t -> string
module Out_name : sig ... endtype namespace=|Type|Module|Module_type|Class|Class_type|OtherOther bypasses the unique name for identifier mechanism
val strings_of_paths : namespace -> Path.t list -> string listPrint a list of paths, using the same naming context to avoid name collisions
val raw_type_expr : Stdlib.Format.formatter -> Types.type_expr -> unitval string_of_label : Asttypes.arg_label -> stringval wrap_printing_env : error:bool -> Env.t -> (unit -> 'a) -> 'a
module Naming_context : sig ... endmodule Conflicts : sig ... endThe
Conflictsmodule keeps track of conflicts arising when attributing names to identifiers and provides functions that can print explanations for these conflict in error messages
val reset : unit -> unitval mark_loops : Types.type_expr -> unitval reset_and_mark_loops : Types.type_expr -> unitval reset_and_mark_loops_list : Types.type_expr list -> unitval type_expr : Stdlib.Format.formatter -> Types.type_expr -> unitval constructor_arguments : Stdlib.Format.formatter -> Types.constructor_arguments -> unitval tree_of_type_scheme : Types.type_expr -> Outcometree.out_typeval type_sch : Stdlib.Format.formatter -> Types.type_expr -> unitval type_scheme : Stdlib.Format.formatter -> Types.type_expr -> unitval reset_names : unit -> unitval type_scheme_max : ?b_reset_names:bool -> Stdlib.Format.formatter -> Types.type_expr -> unitval tree_of_value_description : Ident.t -> Types.value_description -> Outcometree.out_sig_itemval value_description : Ident.t -> Stdlib.Format.formatter -> Types.value_description -> unitval tree_of_type_declaration : Ident.t -> Types.type_declaration -> Types.rec_status -> Outcometree.out_sig_itemval type_declaration : Ident.t -> Stdlib.Format.formatter -> Types.type_declaration -> unitval tree_of_extension_constructor : Ident.t -> Types.extension_constructor -> Types.ext_status -> Outcometree.out_sig_itemval extension_constructor : Ident.t -> Stdlib.Format.formatter -> Types.extension_constructor -> unitval tree_of_module : Ident.t -> ?ellipsis:bool -> Types.module_type -> Types.rec_status -> Outcometree.out_sig_itemval modtype : Stdlib.Format.formatter -> Types.module_type -> unitval signature : Stdlib.Format.formatter -> Types.signature -> unitval tree_of_modtype : Types.module_type -> Outcometree.out_module_typeval tree_of_modtype_declaration : Ident.t -> Types.modtype_declaration -> Outcometree.out_sig_itemval tree_of_signature : Types.signature -> Outcometree.out_sig_item listval tree_of_typexp : bool -> Types.type_expr -> Outcometree.out_typeval modtype_declaration : Ident.t -> Stdlib.Format.formatter -> Types.modtype_declaration -> unitval class_type : Stdlib.Format.formatter -> Types.class_type -> unitval tree_of_class_declaration : Ident.t -> Types.class_declaration -> Types.rec_status -> Outcometree.out_sig_itemval class_declaration : Ident.t -> Stdlib.Format.formatter -> Types.class_declaration -> unitval tree_of_cltype_declaration : Ident.t -> Types.class_type_declaration -> Types.rec_status -> Outcometree.out_sig_itemval cltype_declaration : Ident.t -> Stdlib.Format.formatter -> Types.class_type_declaration -> unitval type_expansion : Types.type_expr -> Stdlib.Format.formatter -> Types.type_expr -> unitval prepare_expansion : (Types.type_expr * Types.type_expr) -> Types.type_expr * Types.type_exprval trace : bool -> bool -> string -> Stdlib.Format.formatter -> (Types.type_expr * Types.type_expr) Ctype.Unification_trace.elt list -> unitval report_unification_error : Stdlib.Format.formatter -> Env.t -> Ctype.Unification_trace.t -> ?type_expected_explanation:(Stdlib.Format.formatter -> unit) -> (Stdlib.Format.formatter -> unit) -> (Stdlib.Format.formatter -> unit) -> unitval report_subtyping_error : Stdlib.Format.formatter -> Env.t -> Ctype.Unification_trace.t -> string -> Ctype.Unification_trace.t -> unitval report_ambiguous_type_error : Stdlib.Format.formatter -> Env.t -> (Path.t * Path.t) -> (Path.t * Path.t) list -> (Stdlib.Format.formatter -> unit) -> (Stdlib.Format.formatter -> unit) -> (Stdlib.Format.formatter -> unit) -> unitval print_items : (Env.t -> Types.signature_item -> 'a option) -> Env.t -> Types.signature_item list -> (Outcometree.out_sig_item * 'a option) listval rewrite_double_underscore_paths : Env.t -> Path.t -> Path.tval printed_signature : string -> Stdlib.Format.formatter -> Types.signature -> unitprinted_signature sourcefile ppf sgprint the signaturesgofsourcefilewith potential warnings for name collisions