Up – Package index » ocaml-base-compiler » Library stdlib » Stdlib » PervasivesModule Stdlib.Pervasives Source ocaml-base-compiler Library bigarray Library dynlink Library ocamlbytecomp Library ocamlcommon Library ocamlmiddleend Library ocamloptcomp Library ocamltoplevel Library odoc_info Library stdlib Library str Library threads Library unix Sources Source val raise_notrace : exn -> 'a Source val invalid_arg : string -> 'a Source val failwith : string -> 'a Source val (=) : 'a -> 'a -> boolSource val (<>) : 'a -> 'a -> boolSource val (<) : 'a -> 'a -> boolSource val (>) : 'a -> 'a -> boolSource val (<=) : 'a -> 'a -> boolSource val (>=) : 'a -> 'a -> boolSource val compare : 'a -> 'a -> intSource val min : 'a -> 'a -> 'a Source val max : 'a -> 'a -> 'a Source val (==) : 'a -> 'a -> boolSource val (!=) : 'a -> 'a -> boolSource val (&&) : bool -> bool -> boolSource val (&) : bool -> bool -> boolSource val (||) : bool -> bool -> boolSource val (or) : bool -> bool -> boolSource val __POS__ : string * int * int * intSource val __LOC_OF__ : 'a -> string * 'a Source val __LINE_OF__ : 'a -> int * 'a Source val __POS_OF__ : 'a -> (string * int * int * int) * 'a Source val (|>) : 'a -> ('a -> 'b ) -> 'b Source val (@@) : ('a -> 'b ) -> 'a -> 'b Source val (+) : int -> int -> intSource val (-) : int -> int -> intSource val (*) : int -> int -> intSource val (/) : int -> int -> intSource val (mod) : int -> int -> intSource val (land) : int -> int -> intSource val (lor) : int -> int -> intSource val (lxor) : int -> int -> intSource val (lsl) : int -> int -> intSource val (lsr) : int -> int -> intSource val (asr) : int -> int -> intSource val (~-.) : float -> floatSource val (~+.) : float -> floatSource val (+.) : float -> float -> floatSource val (-.) : float -> float -> floatSource val (*.) : float -> float -> floatSource val (/.) : float -> float -> floatSource val (**) : float -> float -> floatSource val sqrt : float -> floatSource val exp : float -> floatSource val log : float -> floatSource val log10 : float -> floatSource val expm1 : float -> floatSource val log1p : float -> floatSource val cos : float -> floatSource val sin : float -> floatSource val tan : float -> floatSource val acos : float -> floatSource val asin : float -> floatSource val atan : float -> floatSource val atan2 : float -> float -> floatSource val hypot : float -> float -> floatSource val cosh : float -> floatSource val sinh : float -> floatSource val tanh : float -> floatSource val ceil : float -> floatSource val floor : float -> floatSource val abs_float : float -> floatSource val copysign : float -> float -> floatSource val mod_float : float -> float -> floatSource val frexp : float -> float * intSource val ldexp : float -> int -> floatSource val modf : float -> float * floatSource val float : int -> floatSource val float_of_int : int -> floatSource val truncate : float -> intSource val int_of_float : float -> intSource val neg_infinity : floatSource val epsilon_float : floatSource type nonrec fpclass = fpclass = | FP_normal | FP_subnormal | FP_zero | FP_infinite | FP_nan Source val (^) : string -> string -> stringSource val int_of_char : char -> intSource val char_of_int : int -> charSource val string_of_bool : bool -> stringSource val bool_of_string : string -> boolSource val bool_of_string_opt : string -> bool option Source val string_of_int : int -> stringSource val int_of_string : string -> intSource val int_of_string_opt : string -> int option Source val string_of_float : float -> stringSource val float_of_string : string -> floatSource val float_of_string_opt : string -> float option Source val fst : ('a * 'b ) -> 'a Source val snd : ('a * 'b ) -> 'b Source val (@) : 'a list -> 'a list -> 'a listSource val print_char : char -> unitSource val print_string : string -> unitSource val print_bytes : bytes -> unitSource val print_int : int -> unitSource val print_float : float -> unitSource val print_endline : string -> unitSource val print_newline : unit -> unitSource val prerr_char : char -> unitSource val prerr_string : string -> unitSource val prerr_bytes : bytes -> unitSource val prerr_int : int -> unitSource val prerr_float : float -> unitSource val prerr_endline : string -> unitSource val prerr_newline : unit -> unitSource val read_line : unit -> stringSource val read_int : unit -> intSource val read_int_opt : unit -> int option Source val read_float : unit -> floatSource val read_float_opt : unit -> float option Source type nonrec open_flag = open_flag = | Open_rdonly | Open_wronly | Open_append | Open_creat | Open_trunc | Open_excl | Open_binary | Open_text | Open_nonblock Source val flush_all : unit -> unitSource type nonrec 'a ref = 'a ref = { mutable contents : 'a ;} Source type nonrec ('a, 'b) result = ('a , 'b ) result = | Ok of 'a | Error of 'b Source val (^^) :
('a , 'b , 'c , 'd , 'e , 'f ) format6 ->
('f , 'b , 'c , 'e , 'g , 'h ) format6 ->
('a , 'b , 'c , 'd , 'g , 'h ) format6 Source val at_exit : (unit -> unit) -> unitSource val valid_float_lexem : string -> stringSource val do_at_exit : unit -> unit