Topcommonval preprocess_phrase :
Format.formatter ->
Parsetree.toplevel_phrase ->
Parsetree.toplevel_phraseval find_eval_phrase :
Typedtree.structure ->
(Typedtree.expression * Typedtree.attributes * Location.t) optionval max_printer_depth : int refval max_printer_steps : int refval print_out_value : (Format.formatter -> Outcometree.out_value -> unit) refval print_out_type : (Format.formatter -> Outcometree.out_type -> unit) refval print_out_class_type :
(Format.formatter -> Outcometree.out_class_type -> unit) refval print_out_module_type :
(Format.formatter -> Outcometree.out_module_type -> unit) refval print_out_type_extension :
(Format.formatter -> Outcometree.out_type_extension -> unit) refval print_out_sig_item :
(Format.formatter -> Outcometree.out_sig_item -> unit) refval print_out_signature :
(Format.formatter -> Outcometree.out_sig_item list -> unit) refval print_out_phrase : (Format.formatter -> Outcometree.out_phrase -> unit) refmodule type EVAL_BASE = sig ... endmodule MakeEvalPrinter (_ : EVAL_BASE) : sig ... endtype directive_fun = | Directive_none of unit -> unit| Directive_string of string -> unit| Directive_int of int -> unit| Directive_ident of Longident.t -> unit| Directive_bool of bool -> unitval add_directive : string -> directive_fun -> directive_info -> unitval get_directive : string -> directive_fun optionval get_directive_info : string -> directive_info optionval try_run_directive :
Format.formatter ->
string ->
Parsetree.directive_argument option ->
boolval directive_table : (string, directive_fun) Hashtbl.tval directive_info_table : (string, directive_info) Hashtbl.tval parse_toplevel_phrase : (Lexing.lexbuf -> Parsetree.toplevel_phrase) refval parse_use_file : (Lexing.lexbuf -> Parsetree.toplevel_phrase list) refval print_location : Format.formatter -> Location.t -> unitval print_error : Format.formatter -> Location.error -> unitval print_warning : Location.t -> Format.formatter -> Warnings.t -> unitval input_name : string refval phrase_buffer : Buffer.tval first_line : bool refval got_eof : bool refval read_interactive_input : (string -> bytes -> int -> int * bool) refval toplevel_startup_hook : (unit -> unit) refval add_hook : (event -> unit) -> unitval run_hooks : event -> unitval backtrace : string option refval parse_mod_use_file :
string ->
Lexing.lexbuf ->
Parsetree.toplevel_phrase list