summaryrefslogtreecommitdiffstats
path: root/stdlib/oo.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/oo.mli')
-rw-r--r--stdlib/oo.mli2
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/oo.mli b/stdlib/oo.mli
index 56f550225..d2fc1ff97 100644
--- a/stdlib/oo.mli
+++ b/stdlib/oo.mli
@@ -37,7 +37,7 @@ val set_method: table -> label -> item -> unit
val get_variable: table -> string -> int
val hide_variable: table -> string -> unit
val get_private_variable: table -> string -> int
-val create_class: (table -> unit) -> class_info
+val create_class: class_info -> (table -> unit) -> unit
(* Objects *)
type t