summaryrefslogtreecommitdiffstats
path: root/stdlib/array.mli
diff options
context:
space:
mode:
authorGabriel Scherer <gabriel.scherer@gmail.com>2014-12-19 17:31:47 +0000
committerGabriel Scherer <gabriel.scherer@gmail.com>2014-12-19 17:31:47 +0000
commitd6189d83a44b3bcb2957fa602b304ebf9999664b (patch)
tree72af467c72c5611bfa45f73f294805c3192d55d5 /stdlib/array.mli
parent3fc3a877f6d9234cf412e3bcf9c7a3d26b2e8efd (diff)
Add @since tags on stdlib functions new in 4.02
make_float was added in 4.02 Buffer.(to_bytes, add_bytes, add_subbytes) were added in 4.02. BytesLabels was added in 4.02. Digest.(bytes, subbytes) were added in 4.02. Marshal.(to_bytes, from_bytes) were added in 4.02. various Pervasives functions were added in 4.02: print_bytes prerr_bytes output_bytes output_substring really_input_string Printexc.(backtrace_slots, raw_backtrace_slot) were added in 4.02. Scanf.(ksscanf, kfscanf) were added in 4.02. Stream.of_bytes was added in 4.02. From: Jeremy Yallop <yallop@gmail.com> git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@15687 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
Diffstat (limited to 'stdlib/array.mli')
-rw-r--r--stdlib/array.mli3
1 files changed, 2 insertions, 1 deletions
diff --git a/stdlib/array.mli b/stdlib/array.mli
index 99de0c806..7580f7e75 100644
--- a/stdlib/array.mli
+++ b/stdlib/array.mli
@@ -154,7 +154,8 @@ val fold_right : ('b -> 'a -> 'a) -> 'b array -> 'a -> '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. *)
+ with uninitialized data.
+ @since 4.02 *)
(** {6 Sorting} *)