Up

module Predef

: sig
#
val type_int : Types.type_expr
#
val type_char : Types.type_expr
#
val type_string : Types.type_expr
#
val type_bytes : Types.type_expr
#
val type_float : Types.type_expr
#
val type_bool : Types.type_expr
#
val type_unit : Types.type_expr
#
val type_exn : Types.type_expr
#
val type_array : Types.type_expr -> Types.type_expr
#
val type_list : Types.type_expr -> Types.type_expr
#
val type_option : Types.type_expr -> Types.type_expr
#
val type_nativeint : Types.type_expr
#
val type_int32 : Types.type_expr
#
val type_int64 : Types.type_expr
#
val type_lazy_t : Types.type_expr -> Types.type_expr
#
val path_int : Path.t
#
val path_char : Path.t
#
val path_string : Path.t
#
val path_bytes : Path.t
#
val path_float : Path.t
#
val path_bool : Path.t
#
val path_unit : Path.t
#
val path_exn : Path.t
#
val path_array : Path.t
#
val path_list : Path.t
#
val path_option : Path.t
#
val path_nativeint : Path.t
#
val path_int32 : Path.t
#
val path_int64 : Path.t
#
val path_lazy_t : Path.t
#
val path_match_failure : Path.t
#
val path_assert_failure : Path.t
#
val path_undefined_recursive_module : Path.t
#
val build_initial_env : (Ident.t -> Types.type_declaration -> 'a -> 'a) -> (Ident.t -> Types.extension_constructor -> 'a -> 'a) -> 'a -> 'a * 'a
#
val builtin_values : (string * Ident.t) list
#
val builtin_idents : (string * Ident.t) list
end