summaryrefslogtreecommitdiffstats
path: root/stdlib/sys.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/sys.mli')
-rw-r--r--stdlib/sys.mli9
1 files changed, 7 insertions, 2 deletions
diff --git a/stdlib/sys.mli b/stdlib/sys.mli
index 944b1090f..ae175c2e8 100644
--- a/stdlib/sys.mli
+++ b/stdlib/sys.mli
@@ -11,7 +11,12 @@
(* *)
(***********************************************************************)
-(** System interface. *)
+(** System interface.
+
+ Every function in this module raises [Sys_error] with an
+ informative message when the underlying system call signal
+ an error.
+*)
val argv : string array
(** The command line arguments given to the process.
@@ -99,7 +104,7 @@ val big_endian : bool
@since 4.00.0 *)
val max_string_length : int
-(** Maximum length of a string. *)
+(** Maximum length of strings and byte sequences. *)
val max_array_length : int
(** Maximum length of a normal array. The maximum length of a float