summaryrefslogtreecommitdiffstats
path: root/stdlib/array.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/array.mli')
-rw-r--r--stdlib/array.mli3
1 files changed, 3 insertions, 0 deletions
diff --git a/stdlib/array.mli b/stdlib/array.mli
index 6913e2eb6..7c0049e28 100644
--- a/stdlib/array.mli
+++ b/stdlib/array.mli
@@ -150,6 +150,9 @@ val fold_right : ('b -> 'a -> 'a) -> 'b array -> 'a -> 'a
[f a.(0) (f a.(1) ( ... (f a.(n-1) x) ...))],
where [n] is the length of the array [a]. *)
+external make_float: int -> float array = "caml_make_float_vect"
+(** [Array.make_float n] returns a fresh float array of length [n],
+ with uninitialized data. *)
(** {6 Sorting} *)