]> rtime.felk.cvut.cz Git - l4.git/blob - l4/pkg/ocaml/ocaml/contrib/ocamlbuild/my_std.mli
Update
[l4.git] / l4 / pkg / ocaml / ocaml / contrib / ocamlbuild / my_std.mli
1 (***********************************************************************)
2 (*                             ocamlbuild                              *)
3 (*                                                                     *)
4 (*  Nicolas Pouillard, Berke Durak, projet Gallium, INRIA Rocquencourt *)
5 (*                                                                     *)
6 (*  Copyright 2007 Institut National de Recherche en Informatique et   *)
7 (*  en Automatique.  All rights reserved.  This file is distributed    *)
8 (*  under the terms of the Q Public License version 1.0.               *)
9 (*                                                                     *)
10 (***********************************************************************)
11
12
13 (* Original author: Nicolas Pouillard *)
14 (* My_std *)
15
16 (** Generic utility functions, and system-independent glue. *)
17
18 exception Exit_OK
19 exception Exit_usage of string
20 exception Exit_system_error of string
21 exception Exit_with_code of int
22 exception Exit_silently_with_code of int
23
24 module Outcome : Signatures.OUTCOME
25
26 open Format
27
28 val ksbprintf : (string -> 'a) -> ('b, formatter, unit, 'a) format4 -> 'b
29 val sbprintf : ('a, formatter, unit, string) format4 -> 'a
30
31 module Set : sig
32   module type OrderedTypePrintable = Signatures.OrderedTypePrintable
33   module type S = Signatures.SET
34   module Make (M : OrderedTypePrintable) : S with type elt = M.t
35 end
36
37 module List : Signatures.LIST
38
39 module String : Signatures.STRING
40
41 module Digest : sig
42   type t = string
43   val string : string -> t
44   val substring : string -> int -> int -> t
45   external channel : in_channel -> int -> t = "caml_md5_chan"
46   val file : string -> t
47   val output : out_channel -> t -> unit
48   val input : in_channel -> t
49   val to_hex : t -> string
50 end
51
52 module StringSet : Set.S with type elt = String.t
53
54 val sys_readdir : string -> (string array, exn) Outcome.t
55 val sys_remove : string -> unit
56 val reset_readdir_cache : unit -> unit
57 val reset_filesys_cache : unit -> unit
58 val reset_filesys_cache_for_file : string -> unit
59 val sys_file_exists : string -> bool
60 val sys_command : string -> int
61 val filename_concat : string -> string -> string
62
63 val invalid_arg' : ('a, formatter, unit, 'b) format4 -> 'a
64
65 include Signatures.MISC