Module Ppxlib__.Import
include Base
val (==) : 'a -> 'a -> bool
val (!=) : 'a -> 'a -> bool
val (&) : bool -> bool -> bool
val or : bool -> bool -> bool
val __LOC__ : string
val __FILE__ : string
val __LINE__ : int
val __MODULE__ : string
val __POS__ : string * int * int * int
val __LOC_OF__ : 'a -> string * 'a
val __LINE_OF__ : 'a -> int * 'a
val __POS_OF__ : 'a -> (string * int * int * int) * 'a
val (~+) : int -> int
val succ : int -> int
val pred : int -> int
val (mod) : int -> int -> int
val (~+.) : float -> float
val sqrt : float -> float
val exp : float -> float
val log : float -> float
val log10 : float -> float
val expm1 : float -> float
val log1p : float -> float
val cos : float -> float
val sin : float -> float
val tan : float -> float
val acos : float -> float
val asin : float -> float
val atan : float -> float
val atan2 : float -> float -> float
val hypot : float -> float -> float
val cosh : float -> float
val sinh : float -> float
val tanh : float -> float
val ceil : float -> float
val floor : float -> float
val abs_float : float -> float
val copysign : float -> float -> float
val mod_float : float -> float -> float
val frexp : float -> float * int
val ldexp : float -> int -> float
val modf : float -> float * float
val float : int -> float
val float_of_int : int -> float
val truncate : float -> int
val int_of_float : float -> int
val infinity : float
val neg_infinity : float
val nan : float
val max_float : float
val min_float : float
val epsilon_float : float
val classify_float : float -> fpclass
val int_of_char : char -> int
val char_of_int : int -> char
val string_of_bool : bool -> string
val bool_of_string_opt : string -> bool option
val bool_of_string : string -> bool
val string_of_int : int -> string
val int_of_string_opt : string -> int option
val stdin : in_channel
val stdout : out_channel
val stderr : out_channel
val print_char : char -> unit
val print_string : string -> unit
val print_bytes : bytes -> unit
val print_int : int -> unit
val print_float : float -> unit
val print_endline : string -> unit
val print_newline : unit -> unit
val prerr_char : char -> unit
val prerr_string : string -> unit
val prerr_bytes : bytes -> unit
val prerr_int : int -> unit
val prerr_float : float -> unit
val prerr_endline : string -> unit
val prerr_newline : unit -> unit
val read_line : unit -> string
val read_int_opt : unit -> int option
val read_int : unit -> int
val read_float_opt : unit -> float option
val read_float : unit -> float
type nonrec open_flag
= Stdlib.open_flag
=
|
Open_rdonly
|
Open_wronly
|
Open_append
|
Open_creat
|
Open_trunc
|
Open_excl
|
Open_binary
|
Open_text
|
Open_nonblock
val open_out : string -> out_channel
val open_out_bin : string -> out_channel
val open_out_gen : open_flag list -> int -> string -> out_channel
val flush : out_channel -> unit
val flush_all : unit -> unit
val output_char : out_channel -> char -> unit
val output_string : out_channel -> string -> unit
val output_bytes : out_channel -> bytes -> unit
val output : out_channel -> bytes -> int -> int -> unit
val output_substring : out_channel -> string -> int -> int -> unit
val output_byte : out_channel -> int -> unit
val output_binary_int : out_channel -> int -> unit
val output_value : out_channel -> 'a -> unit
val seek_out : out_channel -> int -> unit
val pos_out : out_channel -> int
val out_channel_length : out_channel -> int
val close_out : out_channel -> unit
val close_out_noerr : out_channel -> unit
val set_binary_mode_out : out_channel -> bool -> unit
val open_in : string -> in_channel
val open_in_bin : string -> in_channel
val open_in_gen : open_flag list -> int -> string -> in_channel
val input_char : in_channel -> char
val input_line : in_channel -> string
val input : in_channel -> bytes -> int -> int -> int
val really_input : in_channel -> bytes -> int -> int -> unit
val really_input_string : in_channel -> int -> string
val input_byte : in_channel -> int
val input_binary_int : in_channel -> int
val input_value : in_channel -> 'a
val seek_in : in_channel -> int -> unit
val pos_in : in_channel -> int
val in_channel_length : in_channel -> int
val close_in : in_channel -> unit
val close_in_noerr : in_channel -> unit
val set_binary_mode_in : in_channel -> bool -> unit
val format_of_string : ('a, 'b, 'c, 'd, 'e, 'f) Stdlib.format6 -> ('a, 'b, 'c, 'd, 'e, 'f) Stdlib.format6
val (^^) : ('a, 'b, 'c, 'd, 'e, 'f) Stdlib.format6 -> ('f, 'b, 'c, 'e, 'g, 'h) Stdlib.format6 -> ('a, 'b, 'c, 'd, 'g, 'h) Stdlib.format6
val exit : int -> 'a
val at_exit : (unit -> unit) -> unit
val valid_float_lexem : string -> string
val unsafe_really_input : in_channel -> bytes -> int -> int -> unit
val do_at_exit : unit -> unit
module Polymorphic_compare = Poly
module type T = sig ... end
module type T1 = sig ... end
module type T2 = sig ... end
module type T3 = sig ... end
type !'a array
= 'a Array.t
val compare_array : ('a -> 'a -> int) -> 'a array -> 'a array -> int
val equal_array : ('a -> 'a -> bool) -> 'a array -> 'a array -> bool
val array_of_sexp : (Base__.Ppx_sexp_conv_lib.Sexp.t -> 'a) -> Base__.Ppx_sexp_conv_lib.Sexp.t -> 'a array
val sexp_of_array : ('a -> Base__.Ppx_sexp_conv_lib.Sexp.t) -> 'a array -> Base__.Ppx_sexp_conv_lib.Sexp.t
val array_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type bool
= Bool.t
val compare_bool : bool -> bool -> int
val equal_bool : bool -> bool -> bool
val hash_fold_bool : Base__.Ppx_hash_lib.Std.Hash.state -> bool -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_bool : bool -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val bool_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> bool
val sexp_of_bool : bool -> Base__.Ppx_sexp_conv_lib.Sexp.t
val bool_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type char
= Char.t
val compare_char : char -> char -> int
val equal_char : char -> char -> bool
val hash_fold_char : Base__.Ppx_hash_lib.Std.Hash.state -> char -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_char : char -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val char_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> char
val sexp_of_char : char -> Base__.Ppx_sexp_conv_lib.Sexp.t
val char_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type exn
= Exn.t
val sexp_of_exn : exn -> Base__.Ppx_sexp_conv_lib.Sexp.t
type float
= Float.t
val compare_float : float -> float -> int
val equal_float : float -> float -> bool
val hash_fold_float : Base__.Ppx_hash_lib.Std.Hash.state -> float -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_float : float -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val float_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> float
val sexp_of_float : float -> Base__.Ppx_sexp_conv_lib.Sexp.t
val float_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type int
= Int.t
val compare_int : int -> int -> int
val equal_int : int -> int -> bool
val hash_fold_int : Base__.Ppx_hash_lib.Std.Hash.state -> int -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_int : int -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val int_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> int
val sexp_of_int : int -> Base__.Ppx_sexp_conv_lib.Sexp.t
val int_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type int32
= Int32.t
val compare_int32 : int32 -> int32 -> int
val equal_int32 : int32 -> int32 -> bool
val hash_fold_int32 : Base__.Ppx_hash_lib.Std.Hash.state -> int32 -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_int32 : int32 -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val int32_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> int32
val sexp_of_int32 : int32 -> Base__.Ppx_sexp_conv_lib.Sexp.t
val int32_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type int64
= Int64.t
val compare_int64 : int64 -> int64 -> int
val equal_int64 : int64 -> int64 -> bool
val hash_fold_int64 : Base__.Ppx_hash_lib.Std.Hash.state -> int64 -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_int64 : int64 -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val int64_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> int64
val sexp_of_int64 : int64 -> Base__.Ppx_sexp_conv_lib.Sexp.t
val int64_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type !'a list
= 'a List.t
val compare_list : ('a -> 'a -> int) -> 'a list -> 'a list -> int
val equal_list : ('a -> 'a -> bool) -> 'a list -> 'a list -> bool
val hash_fold_list : (Base__.Ppx_hash_lib.Std.Hash.state -> 'a -> Base__.Ppx_hash_lib.Std.Hash.state) -> Base__.Ppx_hash_lib.Std.Hash.state -> 'a list -> Base__.Ppx_hash_lib.Std.Hash.state
val list_of_sexp : (Base__.Ppx_sexp_conv_lib.Sexp.t -> 'a) -> Base__.Ppx_sexp_conv_lib.Sexp.t -> 'a list
val sexp_of_list : ('a -> Base__.Ppx_sexp_conv_lib.Sexp.t) -> 'a list -> Base__.Ppx_sexp_conv_lib.Sexp.t
val list_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type nativeint
= Nativeint.t
val compare_nativeint : nativeint -> nativeint -> int
val equal_nativeint : nativeint -> nativeint -> bool
val hash_fold_nativeint : Base__.Ppx_hash_lib.Std.Hash.state -> nativeint -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_nativeint : nativeint -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val nativeint_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> nativeint
val sexp_of_nativeint : nativeint -> Base__.Ppx_sexp_conv_lib.Sexp.t
val nativeint_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type !'a option
= 'a Option.t
val compare_option : ('a -> 'a -> int) -> 'a option -> 'a option -> int
val equal_option : ('a -> 'a -> bool) -> 'a option -> 'a option -> bool
val hash_fold_option : (Base__.Ppx_hash_lib.Std.Hash.state -> 'a -> Base__.Ppx_hash_lib.Std.Hash.state) -> Base__.Ppx_hash_lib.Std.Hash.state -> 'a option -> Base__.Ppx_hash_lib.Std.Hash.state
val option_of_sexp : (Base__.Ppx_sexp_conv_lib.Sexp.t -> 'a) -> Base__.Ppx_sexp_conv_lib.Sexp.t -> 'a option
val sexp_of_option : ('a -> Base__.Ppx_sexp_conv_lib.Sexp.t) -> 'a option -> Base__.Ppx_sexp_conv_lib.Sexp.t
val option_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type !'a ref
= 'a Ref.t
val compare_ref : ('a -> 'a -> int) -> 'a ref -> 'a ref -> int
val equal_ref : ('a -> 'a -> bool) -> 'a ref -> 'a ref -> bool
val ref_of_sexp : (Base__.Ppx_sexp_conv_lib.Sexp.t -> 'a) -> Base__.Ppx_sexp_conv_lib.Sexp.t -> 'a ref
val sexp_of_ref : ('a -> Base__.Ppx_sexp_conv_lib.Sexp.t) -> 'a ref -> Base__.Ppx_sexp_conv_lib.Sexp.t
val ref_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type string
= String.t
val compare_string : string -> string -> int
val equal_string : string -> string -> bool
val hash_fold_string : Base__.Ppx_hash_lib.Std.Hash.state -> string -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_string : string -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val string_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> string
val sexp_of_string : string -> Base__.Ppx_sexp_conv_lib.Sexp.t
val string_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type bytes
= Bytes.t
val compare_bytes : bytes -> bytes -> int
val equal_bytes : bytes -> bytes -> bool
val bytes_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> bytes
val sexp_of_bytes : bytes -> Base__.Ppx_sexp_conv_lib.Sexp.t
val bytes_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type unit
= Unit.t
val compare_unit : unit -> unit -> int
val equal_unit : unit -> unit -> bool
val hash_fold_unit : Base__.Ppx_hash_lib.Std.Hash.state -> unit -> Base__.Ppx_hash_lib.Std.Hash.state
val hash_unit : unit -> Base__.Ppx_hash_lib.Std.Hash.hash_value
val unit_of_sexp : Base__.Ppx_sexp_conv_lib.Sexp.t -> unit
val sexp_of_unit : unit -> Base__.Ppx_sexp_conv_lib.Sexp.t
val unit_sexp_grammar : Base__.Ppx_sexp_conv_lib.Sexp.Private.Raw_grammar.t
type nonrec (!'a, !'b, !'c) format
= ('a, 'b, 'c) Stdlib.format
type nonrec (!'a, !'b, !'c, !'d) format4
= ('a, 'b, 'c, 'd) Stdlib.format4
type nonrec (!'a, !'b, !'c, !'d, !'e, !'f) format6
= ('a, 'b, 'c, 'd, 'e, 'f) Stdlib.format6
type !'a sexp_array
= 'a array
type !'a sexp_list
= 'a list
type !'a sexp_opaque
= 'a
type !'a sexp_option
= 'a option
val (@) : 'a Base__List.t -> 'a Base__List.t -> 'a Base__List.t
val (+) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (-) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (*) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (/) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (~-) : Base__Int.t -> Base__Int.t
val (**) : Base__Int.t -> Base__Int.t -> Base__Int.t
val abs : Base__Int.t -> Base__Int.t
val neg : Base__Int.t -> Base__Int.t
val zero : Base__Int.t
val (%) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (/%) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (//) : Base__Int.t -> Base__Int.t -> float
val (land) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (lor) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (lxor) : Base__Int.t -> Base__Int.t -> Base__Int.t
val (lnot) : Base__Int.t -> Base__Int.t
val (lsl) : Base__Int.t -> int -> Base__Int.t
val (asr) : Base__Int.t -> int -> Base__Int.t
val (lsr) : Base__Int.t -> int -> Base__Int.t
val (<) : int -> int -> bool
val (<=) : int -> int -> bool
val (<>) : int -> int -> bool
val (=) : int -> int -> bool
val (>) : int -> int -> bool
val (>=) : int -> int -> bool
val compare : int -> int -> int
val ascending : int -> int -> int
val descending : int -> int -> int
val equal : int -> int -> bool
val max : int -> int -> int
val min : int -> int -> int
val (+.) : Base__Float.t -> Base__Float.t -> Base__Float.t
val (-.) : Base__Float.t -> Base__Float.t -> Base__Float.t
val (*.) : Base__Float.t -> Base__Float.t -> Base__Float.t
val (/.) : Base__Float.t -> Base__Float.t -> Base__Float.t
val (**.) : Base__Float.t -> Base__Float.t -> Base__Float.t
val (~-.) : Base__Float.t -> Base__Float.t
val (|>) : 'a -> ('a -> 'b) -> 'b
val (@@) : ('a -> 'b) -> 'a -> 'b
val (&&) : bool -> bool -> bool
val (||) : bool -> bool -> bool
val not : bool -> bool
val ignore : 'a -> unit
val raise : exn -> 'a
val failwith : string -> 'a
val invalid_arg : string -> 'a
val raise_s : Base__.Sexp.t -> 'a
val phys_equal : 'a -> 'a -> bool
val force : 'a Lazy.t -> 'a
include Stdio
val stdin : In_channel.t
val stdout : Out_channel.t
val stderr : Out_channel.t
val printf : ('a, Out_channel.t, Base.unit) Base.format -> 'a
val print_s : ?mach:Base.unit -> Base.Sexp.t -> Base.unit
val eprint_s : ?mach:Base.unit -> Base.Sexp.t -> Base.unit
val eprintf : ('a, Out_channel.t, Base.unit) Base.format -> 'a
val print_string : Base.string -> Base.unit
val print_endline : Base.string -> Base.unit
val prerr_endline : Base.string -> Base.unit
include Ppxlib_ast
module Ast = Ppxlib_ast.Ast
module Ast_helper = Ppxlib_ast__.Import.Ast_helper
module Ast_magic = Ppxlib_ast__.Import.Selected_ast.Ast.Config
module Asttypes = Ppxlib_ast__.Import.Asttypes
module Docstrings = Ppxlib_ast__.Import.Docstrings
module Extra_warnings = Ppxlib_ast__.Warn
module Lexer = Ppxlib_ast__.Import.Lexer
module Parse = Ppxlib_ast__.Import.Parse
module Parser = Ppxlib_ast__.Import.Parser
module Parsetree = Ppxlib_ast__.Import.Parsetree
module Pprintast = Ppxlib_ast.Pprintast
module Select_ast = Ppxlib_ast__.Import.Select_ast
module Selected_ast = Ppxlib_ast__.Import.Selected_ast
module Syntaxerr = Ppxlib_ast__.Import.Syntaxerr
module Import_for_core = Ppxlib_ast__.Import
val __FILE__ : string
include Ast
type position
= Stdlib.Lexing.position
=
{
pos_fname : string;
pos_lnum : int;
pos_bol : int;
pos_cnum : int;
}
and location
= Ppxlib_ast__.Import.Location.t
=
{
loc_start : position;
loc_end : position;
loc_ghost : bool;
}
and location_stack
= location list
and 'a loc
= 'a Ppxlib_ast__.Import.Location.loc
=
{
txt : 'a;
loc : location;
}
and longident
= Ppxlib_ast__.Import.Longident.t
=
|
Lident of string
|
Ldot of longident * string
|
Lapply of longident * longident
and longident_loc
= longident loc
and rec_flag
= Ppxlib_ast__.Import.Asttypes.rec_flag
=
|
Nonrecursive
|
Recursive
and direction_flag
= Ppxlib_ast__.Import.Asttypes.direction_flag
=
|
Upto
|
Downto
and private_flag
= Ppxlib_ast__.Import.Asttypes.private_flag
=
|
Private
|
Public
and mutable_flag
= Ppxlib_ast__.Import.Asttypes.mutable_flag
=
|
Immutable
|
Mutable
and virtual_flag
= Ppxlib_ast__.Import.Asttypes.virtual_flag
=
|
Virtual
|
Concrete
and override_flag
= Ppxlib_ast__.Import.Asttypes.override_flag
=
|
Override
|
Fresh
and closed_flag
= Ppxlib_ast__.Import.Asttypes.closed_flag
=
|
Closed
|
Open
and label
= string
and arg_label
= Ppxlib_ast__.Import.Asttypes.arg_label
=
|
Nolabel
|
Labelled of string
|
Optional of string
and variance
= Ppxlib_ast__.Import.Asttypes.variance
=
|
Covariant
|
Contravariant
|
Invariant
and constant
= Ppxlib_ast__.Import.Parsetree.constant
=
|
Pconst_integer of string * char option
|
Pconst_char of char
|
Pconst_string of string * string option
|
Pconst_float of string * char option
Extension points
and attribute
= Ppxlib_ast__.Import.Parsetree.attribute
=
{
attr_name : string loc;
attr_payload : payload;
attr_loc : location;
}
and extension
= string loc * payload
and attributes
= attribute list
and payload
= Ppxlib_ast__.Import.Parsetree.payload
=
|
PStr of structure
|
PSig of signature
|
PTyp of core_type
|
PPat of pattern * expression option
Core language
and core_type
= Ppxlib_ast__.Import.Parsetree.core_type
=
{
ptyp_desc : core_type_desc;
ptyp_loc : location;
ptyp_loc_stack : location_stack;
ptyp_attributes : attributes;
}
and core_type_desc
= Ppxlib_ast__.Import.Parsetree.core_type_desc
=
|
Ptyp_any
|
Ptyp_var of string
|
Ptyp_arrow of arg_label * core_type * core_type
|
Ptyp_tuple of core_type list
|
Ptyp_constr of longident_loc * core_type list
|
Ptyp_object of object_field list * closed_flag
|
Ptyp_class of longident_loc * core_type list
|
Ptyp_alias of core_type * string
|
Ptyp_variant of row_field list * closed_flag * label list option
|
Ptyp_poly of string loc list * core_type
|
Ptyp_package of package_type
|
Ptyp_extension of extension
and package_type
= longident_loc * (longident_loc * core_type) list
and row_field
= Ppxlib_ast__.Import.Parsetree.row_field
=
{
prf_desc : row_field_desc;
prf_loc : location;
prf_attributes : attributes;
}
and row_field_desc
= Ppxlib_ast__.Import.Parsetree.row_field_desc
=
|
Rtag of label loc * bool * core_type list
|
Rinherit of core_type
and object_field
= Ppxlib_ast__.Import.Parsetree.object_field
=
{
pof_desc : object_field_desc;
pof_loc : location;
pof_attributes : attributes;
}
and object_field_desc
= Ppxlib_ast__.Import.Parsetree.object_field_desc
=
|
Otag of label loc * core_type
|
Oinherit of core_type
and pattern
= Ppxlib_ast__.Import.Parsetree.pattern
=
{
ppat_desc : pattern_desc;
ppat_loc : location;
ppat_loc_stack : location_stack;
ppat_attributes : attributes;
}
and pattern_desc
= Ppxlib_ast__.Import.Parsetree.pattern_desc
=
|
Ppat_any
|
Ppat_var of string loc
|
Ppat_alias of pattern * string loc
|
Ppat_constant of constant
|
Ppat_interval of constant * constant
|
Ppat_tuple of pattern list
|
Ppat_construct of longident_loc * pattern option
|
Ppat_variant of label * pattern option
|
Ppat_record of (longident_loc * pattern) list * closed_flag
|
Ppat_array of pattern list
|
Ppat_or of pattern * pattern
|
Ppat_constraint of pattern * core_type
|
Ppat_type of longident_loc
|
Ppat_lazy of pattern
|
Ppat_unpack of string loc
|
Ppat_exception of pattern
|
Ppat_extension of extension
|
Ppat_open of longident_loc * pattern
and expression
= Ppxlib_ast__.Import.Parsetree.expression
=
{
pexp_desc : expression_desc;
pexp_loc : location;
pexp_loc_stack : location_stack;
pexp_attributes : attributes;
}
and expression_desc
= Ppxlib_ast__.Import.Parsetree.expression_desc
=
|
Pexp_ident of longident_loc
|
Pexp_constant of constant
|
Pexp_let of rec_flag * value_binding list * expression
|
Pexp_function of case list
|
Pexp_fun of arg_label * expression option * pattern * expression
|
Pexp_apply of expression * (arg_label * expression) list
|
Pexp_match of expression * case list
|
Pexp_try of expression * case list
|
Pexp_tuple of expression list
|
Pexp_construct of longident_loc * expression option
|
Pexp_variant of label * expression option
|
Pexp_record of (longident_loc * expression) list * expression option
|
Pexp_field of expression * longident_loc
|
Pexp_setfield of expression * longident_loc * expression
|
Pexp_array of expression list
|
Pexp_ifthenelse of expression * expression * expression option
|
Pexp_sequence of expression * expression
|
Pexp_while of expression * expression
|
Pexp_for of pattern * expression * expression * direction_flag * expression
|
Pexp_constraint of expression * core_type
|
Pexp_coerce of expression * core_type option * core_type
|
Pexp_send of expression * label loc
|
Pexp_new of longident_loc
|
Pexp_setinstvar of label loc * expression
|
Pexp_override of (label loc * expression) list
|
Pexp_letmodule of string loc * module_expr * expression
|
Pexp_letexception of extension_constructor * expression
|
Pexp_assert of expression
|
Pexp_lazy of expression
|
Pexp_poly of expression * core_type option
|
Pexp_object of class_structure
|
Pexp_newtype of string loc * expression
|
Pexp_pack of module_expr
|
Pexp_open of open_declaration * expression
|
Pexp_letop of letop
|
Pexp_extension of extension
|
Pexp_unreachable
and case
= Ppxlib_ast__.Import.Parsetree.case
=
{
pc_lhs : pattern;
pc_guard : expression option;
pc_rhs : expression;
}
and letop
= Ppxlib_ast__.Import.Parsetree.letop
=
{
let_ : binding_op;
ands : binding_op list;
body : expression;
}
and binding_op
= Ppxlib_ast__.Import.Parsetree.binding_op
=
{
pbop_op : string loc;
pbop_pat : pattern;
pbop_exp : expression;
pbop_loc : location;
}
and value_description
= Ppxlib_ast__.Import.Parsetree.value_description
=
{
pval_name : string loc;
pval_type : core_type;
pval_prim : string list;
pval_attributes : attributes;
pval_loc : location;
}
and type_declaration
= Ppxlib_ast__.Import.Parsetree.type_declaration
=
{
ptype_name : string loc;
ptype_params : (core_type * variance) list;
ptype_cstrs : (core_type * core_type * location) list;
ptype_kind : type_kind;
ptype_private : private_flag;
ptype_manifest : core_type option;
ptype_attributes : attributes;
ptype_loc : location;
}
and type_kind
= Ppxlib_ast__.Import.Parsetree.type_kind
=
|
Ptype_abstract
|
Ptype_variant of constructor_declaration list
|
Ptype_record of label_declaration list
|
Ptype_open
and label_declaration
= Ppxlib_ast__.Import.Parsetree.label_declaration
=
{
pld_name : string loc;
pld_mutable : mutable_flag;
pld_type : core_type;
pld_loc : location;
pld_attributes : attributes;
}
and constructor_declaration
= Ppxlib_ast__.Import.Parsetree.constructor_declaration
=
{
pcd_name : string loc;
pcd_args : constructor_arguments;
pcd_res : core_type option;
pcd_loc : location;
pcd_attributes : attributes;
}
and constructor_arguments
= Ppxlib_ast__.Import.Parsetree.constructor_arguments
=
|
Pcstr_tuple of core_type list
|
Pcstr_record of label_declaration list
and type_extension
= Ppxlib_ast__.Import.Parsetree.type_extension
=
{
ptyext_path : longident_loc;
ptyext_params : (core_type * variance) list;
ptyext_constructors : extension_constructor list;
ptyext_private : private_flag;
ptyext_loc : location;
ptyext_attributes : attributes;
}
and extension_constructor
= Ppxlib_ast__.Import.Parsetree.extension_constructor
=
{
pext_name : string loc;
pext_kind : extension_constructor_kind;
pext_loc : location;
pext_attributes : attributes;
}
and type_exception
= Ppxlib_ast__.Import.Parsetree.type_exception
=
{
ptyexn_constructor : extension_constructor;
ptyexn_loc : location;
ptyexn_attributes : attributes;
}
and extension_constructor_kind
= Ppxlib_ast__.Import.Parsetree.extension_constructor_kind
=
|
Pext_decl of constructor_arguments * core_type option
|
Pext_rebind of longident_loc
Class language
and class_type
= Ppxlib_ast__.Import.Parsetree.class_type
=
{
pcty_desc : class_type_desc;
pcty_loc : location;
pcty_attributes : attributes;
}
and class_type_desc
= Ppxlib_ast__.Import.Parsetree.class_type_desc
=
|
Pcty_constr of longident_loc * core_type list
|
Pcty_signature of class_signature
|
Pcty_arrow of arg_label * core_type * class_type
|
Pcty_extension of extension
|
Pcty_open of open_description * class_type
and class_signature
= Ppxlib_ast__.Import.Parsetree.class_signature
=
{
pcsig_self : core_type;
pcsig_fields : class_type_field list;
}
and class_type_field
= Ppxlib_ast__.Import.Parsetree.class_type_field
=
{
pctf_desc : class_type_field_desc;
pctf_loc : location;
pctf_attributes : attributes;
}
and class_type_field_desc
= Ppxlib_ast__.Import.Parsetree.class_type_field_desc
=
|
Pctf_inherit of class_type
|
Pctf_val of label loc * mutable_flag * virtual_flag * core_type
|
Pctf_method of label loc * private_flag * virtual_flag * core_type
|
Pctf_constraint of core_type * core_type
|
Pctf_attribute of attribute
|
Pctf_extension of extension
and 'a class_infos
= 'a Ppxlib_ast__.Import.Parsetree.class_infos
=
{
pci_virt : virtual_flag;
pci_params : (core_type * variance) list;
pci_name : string loc;
pci_expr : 'a;
pci_loc : location;
pci_attributes : attributes;
}
and class_description
= class_type class_infos
and class_type_declaration
= class_type class_infos
and class_expr
= Ppxlib_ast__.Import.Parsetree.class_expr
=
{
pcl_desc : class_expr_desc;
pcl_loc : location;
pcl_attributes : attributes;
}
and class_expr_desc
= Ppxlib_ast__.Import.Parsetree.class_expr_desc
=
|
Pcl_constr of longident_loc * core_type list
|
Pcl_structure of class_structure
|
Pcl_fun of arg_label * expression option * pattern * class_expr
|
Pcl_apply of class_expr * (arg_label * expression) list
|
Pcl_let of rec_flag * value_binding list * class_expr
|
Pcl_constraint of class_expr * class_type
|
Pcl_extension of extension
|
Pcl_open of open_description * class_expr
and class_structure
= Ppxlib_ast__.Import.Parsetree.class_structure
=
{
pcstr_self : pattern;
pcstr_fields : class_field list;
}
and class_field
= Ppxlib_ast__.Import.Parsetree.class_field
=
{
pcf_desc : class_field_desc;
pcf_loc : location;
pcf_attributes : attributes;
}
and class_field_desc
= Ppxlib_ast__.Import.Parsetree.class_field_desc
=
|
Pcf_inherit of override_flag * class_expr * string loc option
|
Pcf_val of label loc * mutable_flag * class_field_kind
|
Pcf_method of label loc * private_flag * class_field_kind
|
Pcf_constraint of core_type * core_type
|
Pcf_initializer of expression
|
Pcf_attribute of attribute
|
Pcf_extension of extension
and class_field_kind
= Ppxlib_ast__.Import.Parsetree.class_field_kind
=
|
Cfk_virtual of core_type
|
Cfk_concrete of override_flag * expression
and class_declaration
= class_expr class_infos
Module language
and module_type
= Ppxlib_ast__.Import.Parsetree.module_type
=
{
pmty_desc : module_type_desc;
pmty_loc : location;
pmty_attributes : attributes;
}
and module_type_desc
= Ppxlib_ast__.Import.Parsetree.module_type_desc
=
|
Pmty_ident of longident_loc
|
Pmty_signature of signature
|
Pmty_functor of string loc * module_type option * module_type
|
Pmty_with of module_type * with_constraint list
|
Pmty_typeof of module_expr
|
Pmty_extension of extension
|
Pmty_alias of longident_loc
and signature
= signature_item list
and signature_item
= Ppxlib_ast__.Import.Parsetree.signature_item
=
{
psig_desc : signature_item_desc;
psig_loc : location;
}
and signature_item_desc
= Ppxlib_ast__.Import.Parsetree.signature_item_desc
=
|
Psig_value of value_description
|
Psig_type of rec_flag * type_declaration list
|
Psig_typesubst of type_declaration list
|
Psig_typext of type_extension
|
Psig_exception of type_exception
|
Psig_module of module_declaration
|
Psig_modsubst of module_substitution
|
Psig_recmodule of module_declaration list
|
Psig_modtype of module_type_declaration
|
Psig_open of open_description
|
Psig_include of include_description
|
Psig_class of class_description list
|
Psig_class_type of class_type_declaration list
|
Psig_attribute of attribute
|
Psig_extension of extension * attributes
and module_declaration
= Ppxlib_ast__.Import.Parsetree.module_declaration
=
{
pmd_name : string loc;
pmd_type : module_type;
pmd_attributes : attributes;
pmd_loc : location;
}
and module_substitution
= Ppxlib_ast__.Import.Parsetree.module_substitution
=
{
pms_name : string loc;
pms_manifest : longident_loc;
pms_attributes : attributes;
pms_loc : location;
}
and module_type_declaration
= Ppxlib_ast__.Import.Parsetree.module_type_declaration
=
{
pmtd_name : string loc;
pmtd_type : module_type option;
pmtd_attributes : attributes;
pmtd_loc : location;
}
and 'a open_infos
= 'a Ppxlib_ast__.Import.Parsetree.open_infos
=
{
popen_expr : 'a;
popen_override : override_flag;
popen_loc : location;
popen_attributes : attributes;
}
and open_description
= longident_loc open_infos
and open_declaration
= module_expr open_infos
and 'a include_infos
= 'a Ppxlib_ast__.Import.Parsetree.include_infos
=
{
pincl_mod : 'a;
pincl_loc : location;
pincl_attributes : attributes;
}
and include_description
= module_type include_infos
and include_declaration
= module_expr include_infos
and with_constraint
= Ppxlib_ast__.Import.Parsetree.with_constraint
=
|
Pwith_type of longident_loc * type_declaration
|
Pwith_module of longident_loc * longident_loc
|
Pwith_typesubst of longident_loc * type_declaration
|
Pwith_modsubst of longident_loc * longident_loc
and module_expr
= Ppxlib_ast__.Import.Parsetree.module_expr
=
{
pmod_desc : module_expr_desc;
pmod_loc : location;
pmod_attributes : attributes;
}
and module_expr_desc
= Ppxlib_ast__.Import.Parsetree.module_expr_desc
=
|
Pmod_ident of longident_loc
|
Pmod_structure of structure
|
Pmod_functor of string loc * module_type option * module_expr
|
Pmod_apply of module_expr * module_expr
|
Pmod_constraint of module_expr * module_type
|
Pmod_unpack of expression
|
Pmod_extension of extension
and structure
= structure_item list
and structure_item
= Ppxlib_ast__.Import.Parsetree.structure_item
=
{
pstr_desc : structure_item_desc;
pstr_loc : location;
}
and structure_item_desc
= Ppxlib_ast__.Import.Parsetree.structure_item_desc
=
|
Pstr_eval of expression * attributes
|
Pstr_value of rec_flag * value_binding list
|
Pstr_primitive of value_description
|
Pstr_type of rec_flag * type_declaration list
|
Pstr_typext of type_extension
|
Pstr_exception of type_exception
|
Pstr_module of module_binding
|
Pstr_recmodule of module_binding list
|
Pstr_modtype of module_type_declaration
|
Pstr_open of open_declaration
|
Pstr_class of class_declaration list
|
Pstr_class_type of class_type_declaration list
|
Pstr_include of include_declaration
|
Pstr_attribute of attribute
|
Pstr_extension of extension * attributes
and value_binding
= Ppxlib_ast__.Import.Parsetree.value_binding
=
{
pvb_pat : pattern;
pvb_expr : expression;
pvb_attributes : attributes;
pvb_loc : location;
}
and module_binding
= Ppxlib_ast__.Import.Parsetree.module_binding
=
{
pmb_name : string loc;
pmb_expr : module_expr;
pmb_attributes : attributes;
pmb_loc : location;
}
Toplevel
and toplevel_phrase
= Ppxlib_ast__.Import.Parsetree.toplevel_phrase
=
|
Ptop_def of structure
|
Ptop_dir of toplevel_directive
and toplevel_directive
= Ppxlib_ast__.Import.Parsetree.toplevel_directive
=
{
pdir_name : string loc;
pdir_arg : directive_argument option;
pdir_loc : location;
}
and directive_argument
= Ppxlib_ast__.Import.Parsetree.directive_argument
=
{
pdira_desc : directive_argument_desc;
pdira_loc : location;
}
and directive_argument_desc
= Ppxlib_ast__.Import.Parsetree.directive_argument_desc
=
|
Pdir_string of string
|
Pdir_int of string * char option
|
Pdir_ident of longident
|
Pdir_bool of bool
class virtual map : object ... end
class virtual iter : object ... end
class virtual +'b fold : object ... end
class virtual +'b fold_map : object ... end
class virtual +'b map_with_context : object ... end
class virtual +'b lift : object ... end