]> rtime.felk.cvut.cz Git - l4.git/blob - l4/pkg/ocaml/ocaml/contrib/stdlib/oo.mli
Update
[l4.git] / l4 / pkg / ocaml / ocaml / contrib / stdlib / oo.mli
1 (***********************************************************************)
2 (*                                                                     *)
3 (*                           Objective Caml                            *)
4 (*                                                                     *)
5 (*         Jerome Vouillon, projet Cristal, INRIA Rocquencourt         *)
6 (*                                                                     *)
7 (*  Copyright 1996 Institut National de Recherche en Informatique et   *)
8 (*  en Automatique.  All rights reserved.  This file is distributed    *)
9 (*  under the terms of the GNU Library General Public License, with    *)
10 (*  the special exception on linking described in file ../LICENSE.     *)
11 (*                                                                     *)
12 (***********************************************************************)
13
14 (* $Id: oo.mli 6331 2004-05-26 11:10:52Z garrigue $ *)
15
16 (** Operations on objects *)
17
18 val copy : (< .. > as 'a) -> 'a
19 (** [Oo.copy o] returns a copy of object [o], that is a fresh
20    object with the same methods and instance variables as [o]  *)
21
22 external id : < .. > -> int = "%field1"
23 (** Return an integer identifying this object, unique for
24     the current execution of the program. *)
25
26 (**/**)
27 (** For internal use (CamlIDL) *)
28 val new_method : string -> CamlinternalOO.tag
29 val public_method_label : string -> CamlinternalOO.tag