include BaseThis module is the toplevel of the Base library; it's what you get when you write
open Base.
The recommended way to use Base is to build with -open Base. Files compiled this
way will have the environment described in this file as their initial environment.
Base extends some modules and data structures from the standard library, like Array,
Buffer, Bytes, Char, Hashtbl, Int32, Int64, Lazy, List, Map,
Nativeint, Printf, Random, Set, String, Sys, and Uchar. One key
difference is that Base doesn't use exceptions as much as the standard library and
instead makes heavy use of the Result type, as in:
type ('a,'b) result = Ok of 'a | Error of 'bBase also adds entirely new modules, most notably:
Comparable, Comparator, and Comparisons in lieu of polymorphic compare.Container, which provides a consistent interface across container-like data
structures (arrays, lists, strings).Result, Error, and Or_error, supporting the or-error pattern.Broadly the goal of Base is both to be a more complete standard library, with richer APIs, and to be more consistent in its design. For instance, in the standard library some things have modules and others don't; in Base, everything is a module.
module Applicative = Base.Applicativemodule Array = Base.Arraymodule Avltree = Base.Avltreemodule Backtrace = Base.Backtracemodule Binary_search = Base.Binary_searchmodule Binary_searchable = Base.Binary_searchablemodule Blit = Base.Blitmodule Bool = Base.Boolmodule Buffer = Base.Buffermodule Bytes = Base.Bytesmodule Char = Base.Charmodule Commutative_group = Base.Commutative_groupmodule Comparable = Base.Comparablemodule Comparator = Base.Comparatormodule Comparisons = Base.Comparisonsmodule Container = Base.Containermodule Either = Base.Eithermodule Equal = Base.Equalmodule Error = Base.Errormodule Exn = Base.Exnmodule Field = Base.Fieldmodule Float = Base.Floatmodule Floatable = Base.Floatablemodule Fn = Base.Fnmodule Formatter = Base.Formattermodule Hash = Base.Hashmodule Hash_set = Base.Hash_setmodule Hashable = Base.Hashablemodule Hasher = Base.Hashermodule Hashtbl = Base.Hashtblmodule Heap_block = Base.Heap_blockmodule Identifiable = Base.Identifiablemodule Indexed_container = Base.Indexed_containermodule Info = Base.Infomodule Int = Base.Intmodule Int32 = Base.Int32module Int63 = Base.Int63module Int64 = Base.Int64module Intable = Base.Intablemodule Invariant = Base.Invariantmodule Lazy = Base.Lazymodule List = Base.Listmodule Map = Base.Mapmodule Maybe_bound = Base.Maybe_boundmodule Monad = Base.Monadmodule Nativeint = Base.Nativeintmodule Option = Base.Optionmodule Option_array = Base.Option_arraymodule Or_error = Base.Or_errormodule Ordered_collection_common = Base.Ordered_collection_commonmodule Ordering = Base.Orderingmodule Poly = Base.PolyPoly is a convenient shorthand for Polymorphic_compare in the common case that one
wants to use a polymorphic comparator directly in an expression, e.g., Poly.equal a
b.
module Polymorphic_compare = Base.Polymorphic_comparemodule Popcount = Base.Popcountmodule Pretty_printer = Base.Pretty_printermodule Printf = Base.Printfmodule Linked_queue = Base.Linked_queuemodule Queue = Base.Queuemodule Random = Base.Randommodule Ref = Base.Refmodule Result = Base.Resultmodule Sequence = Base.Sequencemodule Set = Base.Setmodule Sexpable = Base.Sexpablemodule Sign = Base.Signmodule Source_code_position = Base.Source_code_positionmodule Staged = Base.Stagedmodule String = Base.Stringmodule Stringable = Base.Stringablemodule Sys = Base.Sysmodule T = Base.Tmodule Type_equal = Base.Type_equalmodule Uniform_array = Base.Uniform_arraymodule Unit = Base.Unitmodule Uchar = Base.Ucharmodule Validate = Base.Validatemodule Variant = Base.Variantmodule With_return = Base.With_returnmodule Word_size = Base.Word_sizeinclude TThis module defines various abstract interfaces that are convenient when one needs a module that matches a bare signature with just a type. This sometimes occurs in functor arguments and in interfaces.
module type T : sig ... endmodule type T1 : sig ... endmodule type T2 : sig ... endmodule type T3 : sig ... endmodule Sexp = Base.Sexpmodule Export = Base.Exportinclude Exportval hash_fold_bool : Hash.state ‑> bool ‑> Hash.stateval hash_bool : bool ‑> Hash.hash_valueval hash_fold_char : Hash.state ‑> char ‑> Hash.stateval hash_char : char ‑> Hash.hash_valueval hash_fold_float : Hash.state ‑> float ‑> Hash.stateval hash_float : float ‑> Hash.hash_valueval hash_fold_int : Hash.state ‑> int ‑> Hash.stateval hash_int : int ‑> Hash.hash_valueval hash_fold_int32 : Hash.state ‑> int32 ‑> Hash.stateval hash_int32 : int32 ‑> Hash.hash_valueval hash_fold_int64 : Hash.state ‑> int64 ‑> Hash.stateval hash_int64 : int64 ‑> Hash.hash_valueval hash_fold_list : a. (Hash.state ‑> 'a ‑> Hash.state) ‑> Hash.state ‑> 'a list ‑> Hash.stateval hash_fold_nativeint : Hash.state ‑> nativeint ‑> Hash.stateval hash_nativeint : nativeint ‑> Hash.hash_valueval hash_fold_option : a. (Hash.state ‑> 'a ‑> Hash.state) ‑> Hash.state ‑> 'a option ‑> Hash.stateval hash_fold_string : Hash.state ‑> string ‑> Hash.stateval hash_string : string ‑> Hash.hash_valueval hash_fold_unit : Hash.state ‑> unit ‑> Hash.stateval hash_unit : unit ‑> Hash.hash_valueFormat stuff
Exporting the ad-hoc types that are recognized by ppx_sexp_* converters.
sexp_array, sexp_list, and sexp_option allow a record field to be absent when
converting from a sexp, and if absent, the field will take a default value of the
appropriate type:
sexp_array [||]
sexp_bool false
sexp_list []
sexp_option Nonesexp_opaque causes the conversion to sexp to produce the atom <opaque>.
For more documentation, see sexplib/README.md.
List operators
include List.Infixval (@) : 'a Base__List.t ‑> 'a Base__List.t ‑> 'a Base__List.tInt operators and comparisons
include Int.OA sub-module designed to be opened to make working with ints more convenient.
Float operators
include Float.O_dotSimilar to O, except that operators are suffixed with a dot, allowing one to have
both int and float operators in scope simultaneously.
Similar to O, except that operators are suffixed with a dot, allowing one to have
both int and float operators in scope simultaneously.
val (+.) : Base.Float.t ‑> Base.Float.t ‑> Base.Float.tval (-.) : Base.Float.t ‑> Base.Float.t ‑> Base.Float.tval (*.) : Base.Float.t ‑> Base.Float.t ‑> Base.Float.tval (/.) : Base.Float.t ‑> Base.Float.t ‑> Base.Float.tval (**.) : Base.Float.t ‑> Base.Float.t ‑> Base.Float.tval (~-.) : Base.Float.t ‑> Base.Float.texternal (|>) : 'a ‑> ('a ‑> 'b) ‑> 'b = "%revapply" Reverse application operator. x |> g |> f is equivalent to f (g (x)).
external (@@) : ('a ‑> 'b) ‑> 'a ‑> 'b = "%apply" Application operator. g @@ f @@ x is equivalent to g (f (x)).
Boolean operations
external ignore : _ ‑> unit = "%ignore" Reference operations
external (!) : 'a ref ‑> 'a = "%field0" external ref : 'a ‑> 'a ref = "%makemutable" Pair operations
Exceptions stuff
val raise_s : Sexp.t ‑> 'aMisc
external force : 'a Lazy.t ‑> 'a = "%lazy_force" module Continue_or_stop = Base__.Container_intf.Export.Continue_or_stopContinue_or_stop.t is used by the f argument to fold_until in order to
indicate whether folding should continue, or stop early.
exception Not_found_s of Sexplib0.Sexp.tmodule Not_exposed_properly = Base.Not_exposed_properlyinclude Ppxlib_astmodule Ast = Ppxlib_ast.Astmodule Ast_helper = Ppxlib_ast.Ast_helpermodule Ast_magic = Ppxlib_ast__.Import.Selected_ast.Ast.Configmodule Asttypes = Ppxlib_ast__.Import.Asttypesmodule Docstrings = Ppxlib_ast.Docstringsmodule Extra_warnings = Ppxlib_ast__.Warnmodule Lexer = Ppxlib_ast.Lexermodule Parse = Ppxlib_ast.Parsemodule Parser = Ppxlib_ast.Parsermodule Parsetree = Ppxlib_ast__.Import.Parsetreemodule Pprintast = Ppxlib_ast.Pprintastmodule Select_ast = Ppxlib_ast__.Import.Select_astmodule Selected_ast = Ppxlib_ast__.Import.Selected_astmodule Syntaxerr = Ppxlib_ast.Syntaxerrmodule Import_for_core = Ppxlib_ast__.Importexternal __FILE__ : string = "%loc_FILE" include AstDefinition of the OCaml AST
type location = Ppxlib_ast__.Import.Location.t = {loc_start : position; |
loc_end : position; |
loc_ghost : bool; |
}type longident = Ppxlib_ast__.Import.Longident.t = | Lident of string |
| Ldot of longident * string |
| Lapply of longident * longident |
Auxiliary AST types used by parsetree and typedtree.
type arg_label = Ppxlib_ast__.Import.Asttypes.arg_label = | Nolabel |
| Labelled of string |
| Optional of string |
Abstract syntax tree produced by parsing
type 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 |
type payload = Ppxlib_ast__.Import.Parsetree.payload = | PStr of structure |
| PSig of signature |
| PTyp of core_type |
| PPat of pattern * expression option |
type core_type = Ppxlib_ast__.Import.Parsetree.core_type = {ptyp_desc : core_type_desc; |
ptyp_loc : location; |
ptyp_attributes : attributes; |
}type 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 (string loc * attributes * core_type) 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 |
type row_field = Ppxlib_ast__.Import.Parsetree.row_field = | Rtag of label * attributes * bool * core_type list |
| Rinherit of core_type |
type pattern = Ppxlib_ast__.Import.Parsetree.pattern = {ppat_desc : pattern_desc; |
ppat_loc : location; |
ppat_attributes : attributes; |
}type 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 |
type expression = Ppxlib_ast__.Import.Parsetree.expression = {pexp_desc : expression_desc; |
pexp_loc : location; |
pexp_attributes : attributes; |
}type 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 * string loc |
| Pexp_new of longident_loc |
| Pexp_setinstvar of string loc * expression |
| Pexp_override of (string 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 override_flag * longident_loc * expression |
| Pexp_extension of extension |
| Pexp_unreachable |
type case = Ppxlib_ast__.Import.Parsetree.case = {pc_lhs : pattern; |
pc_guard : expression option; |
pc_rhs : expression; |
}type 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; |
}type 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; |
}type type_kind = Ppxlib_ast__.Import.Parsetree.type_kind = | Ptype_abstract |
| Ptype_variant of constructor_declaration list |
| Ptype_record of label_declaration list |
| Ptype_open |
type 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; |
}type 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; |
}type constructor_arguments = Ppxlib_ast__.Import.Parsetree.constructor_arguments = | Pcstr_tuple of core_type list |
| Pcstr_record of label_declaration list |
type 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_attributes : attributes; |
}type extension_constructor = Ppxlib_ast__.Import.Parsetree.extension_constructor = {pext_name : string loc; |
pext_kind : extension_constructor_kind; |
pext_loc : location; |
pext_attributes : attributes; |
}type extension_constructor_kind = Ppxlib_ast__.Import.Parsetree.extension_constructor_kind = | Pext_decl of constructor_arguments * core_type option |
| Pext_rebind of longident_loc |
type class_type = Ppxlib_ast__.Import.Parsetree.class_type = {pcty_desc : class_type_desc; |
pcty_loc : location; |
pcty_attributes : attributes; |
}type 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 |
type class_signature = Ppxlib_ast__.Import.Parsetree.class_signature = {pcsig_self : core_type; |
pcsig_fields : class_type_field list; |
}type class_type_field = Ppxlib_ast__.Import.Parsetree.class_type_field = {pctf_desc : class_type_field_desc; |
pctf_loc : location; |
pctf_attributes : attributes; |
}type class_type_field_desc = Ppxlib_ast__.Import.Parsetree.class_type_field_desc = | Pctf_inherit of class_type |
| Pctf_val of string loc * mutable_flag * virtual_flag * core_type |
| Pctf_method of string loc * private_flag * virtual_flag * core_type |
| Pctf_constraint of core_type * core_type |
| Pctf_attribute of attribute |
| Pctf_extension of extension |
type '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; |
}type class_expr = Ppxlib_ast__.Import.Parsetree.class_expr = {pcl_desc : class_expr_desc; |
pcl_loc : location; |
pcl_attributes : attributes; |
}type 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 |
type class_structure = Ppxlib_ast__.Import.Parsetree.class_structure = {pcstr_self : pattern; |
pcstr_fields : class_field list; |
}type class_field = Ppxlib_ast__.Import.Parsetree.class_field = {pcf_desc : class_field_desc; |
pcf_loc : location; |
pcf_attributes : attributes; |
}type class_field_desc = Ppxlib_ast__.Import.Parsetree.class_field_desc = | Pcf_inherit of override_flag * class_expr * string loc option |
| Pcf_val of string loc * mutable_flag * class_field_kind |
| Pcf_method of string 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 |
type class_field_kind = Ppxlib_ast__.Import.Parsetree.class_field_kind = | Cfk_virtual of core_type |
| Cfk_concrete of override_flag * expression |
type module_type = Ppxlib_ast__.Import.Parsetree.module_type = {pmty_desc : module_type_desc; |
pmty_loc : location; |
pmty_attributes : attributes; |
}type 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 |
type signature_item = Ppxlib_ast__.Import.Parsetree.signature_item = {psig_desc : signature_item_desc; |
psig_loc : location; |
}type signature_item_desc = Ppxlib_ast__.Import.Parsetree.signature_item_desc = | Psig_value of value_description |
| Psig_type of rec_flag * type_declaration list |
| Psig_typext of type_extension |
| Psig_exception of extension_constructor |
| Psig_module of module_declaration |
| 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 |
type module_declaration = Ppxlib_ast__.Import.Parsetree.module_declaration = {pmd_name : string loc; |
pmd_type : module_type; |
pmd_attributes : attributes; |
pmd_loc : location; |
}type 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; |
}type open_description = Ppxlib_ast__.Import.Parsetree.open_description = {popen_lid : longident_loc; |
popen_override : override_flag; |
popen_loc : location; |
popen_attributes : attributes; |
}type 'a include_infos = 'a Ppxlib_ast__.Import.Parsetree.include_infos = {pincl_mod : 'a; |
pincl_loc : location; |
pincl_attributes : attributes; |
}type 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 type_declaration |
| Pwith_modsubst of string loc * longident_loc |
type module_expr = Ppxlib_ast__.Import.Parsetree.module_expr = {pmod_desc : module_expr_desc; |
pmod_loc : location; |
pmod_attributes : attributes; |
}type 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 |
type structure_item = Ppxlib_ast__.Import.Parsetree.structure_item = {pstr_desc : structure_item_desc; |
pstr_loc : location; |
}type 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 extension_constructor |
| Pstr_module of module_binding |
| Pstr_recmodule of module_binding list |
| Pstr_modtype of module_type_declaration |
| Pstr_open of open_description |
| 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 |
type value_binding = Ppxlib_ast__.Import.Parsetree.value_binding = {pvb_pat : pattern; |
pvb_expr : expression; |
pvb_attributes : attributes; |
pvb_loc : location; |
}type module_binding = Ppxlib_ast__.Import.Parsetree.module_binding = {pmb_name : string loc; |
pmb_expr : module_expr; |
pmb_attributes : attributes; |
pmb_loc : location; |
}type toplevel_phrase = Ppxlib_ast__.Import.Parsetree.toplevel_phrase = | Ptop_def of structure |
| Ptop_dir of string * directive_argument |
type directive_argument = Ppxlib_ast__.Import.Parsetree.directive_argument = | Pdir_none |
| Pdir_string of string |
| Pdir_int of string * char option |
| Pdir_ident of longident |
| Pdir_bool of bool |
class virtual map : object ... endclass virtual iter : object ... endclass virtual +'b fold : object ... endclass virtual +'b fold_map : object ... endclass virtual +'b map_with_context : object ... endclass virtual +'b lift : object ... end