summaryrefslogtreecommitdiffstats
path: root/stdlib/stdLabels.mli
diff options
context:
space:
mode:
authorJacques Garrigue <garrigue at math.nagoya-u.ac.jp>2001-09-27 08:24:50 +0000
committerJacques Garrigue <garrigue at math.nagoya-u.ac.jp>2001-09-27 08:24:50 +0000
commit42c72b10d61a658109375b4042ac10dcfed91bf0 (patch)
treebddc9b399781a6d1d492d107ed42b724a82a1554 /stdlib/stdLabels.mli
parent4cf25f9e3e5f512bf058a213a4bff7e54afee01c (diff)
documentation
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@3802 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
Diffstat (limited to 'stdlib/stdLabels.mli')
-rw-r--r--stdlib/stdLabels.mli10
1 files changed, 8 insertions, 2 deletions
diff --git a/stdlib/stdLabels.mli b/stdlib/stdLabels.mli
index 0bcc6fba2..a36de429a 100644
--- a/stdlib/stdLabels.mli
+++ b/stdlib/stdLabels.mli
@@ -12,8 +12,14 @@
(* $Id$ *)
-(* Module [StdLabels]: meta-module for labelled libraries *)
-(* See the real interfaces in ArrayLabels, ListLabels and StringLabels *)
+(* Module [StdLabels]: standard labeled libraries *)
+
+(* This meta-module provides labelized version of the [Array],
+ [List] and [String] modules.
+
+ They only differ by their labels. Detailed interfaces can be found
+ in [arrayLabels.mli], [listLabels.mli] and [stringLabels.mli].
+*)
module Array : sig
external length : 'a array -> int = "%array_length"