]> rtime.felk.cvut.cz Git - l4.git/blobdiff - l4/pkg/ocaml/contrib/stdlib/camlinternalLazy.mli
Update
[l4.git] / l4 / pkg / ocaml / contrib / stdlib / camlinternalLazy.mli
diff --git a/l4/pkg/ocaml/contrib/stdlib/camlinternalLazy.mli b/l4/pkg/ocaml/contrib/stdlib/camlinternalLazy.mli
deleted file mode 100644 (file)
index 019fce3..0000000
+++ /dev/null
@@ -1,25 +0,0 @@
-(***********************************************************************)
-(*                                                                     *)
-(*                           Objective Caml                            *)
-(*                                                                     *)
-(*            Damien Doligez, projet Para, INRIA Rocquencourt          *)
-(*                                                                     *)
-(*  Copyright 1997 Institut National de Recherche en Informatique et   *)
-(*  en Automatique.  All rights reserved.  This file is distributed    *)
-(*  under the terms of the GNU Library General Public License, with    *)
-(*  the special exception on linking described in file ../LICENSE.     *)
-(*                                                                     *)
-(***********************************************************************)
-
-(* $Id: camlinternalLazy.mli 8974 2008-08-01 16:57:10Z mauny $ *)
-
-(* Internals of forcing lazy values *)
-
-exception Undefined;;
-
-val force_lazy_block : 'a lazy_t -> 'a ;;
-
-val force_val_lazy_block : 'a lazy_t -> 'a ;;
-
-val force : 'a lazy_t -> 'a ;;
-val force_val : 'a lazy_t -> 'a ;;