summaryrefslogtreecommitdiffstats
path: root/stdlib/sys.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/sys.mli')
-rw-r--r--stdlib/sys.mli4
1 files changed, 2 insertions, 2 deletions
diff --git a/stdlib/sys.mli b/stdlib/sys.mli
index 3d6099899..e10319ba8 100644
--- a/stdlib/sys.mli
+++ b/stdlib/sys.mli
@@ -32,7 +32,7 @@ external command: string -> int = "sys_system_command"
external chdir: string -> unit = "sys_chdir"
(* Change the current working directory of the process. *)
external getcwd: unit -> string = "sys_getcwd"
- (* Return the current working directory of the process. *)
+ (* Return the current working directory of the process. *)
val interactive: bool ref
(* This reference is initially set to [false] in standalone
programs and to [true] if the code is being executed under
@@ -92,4 +92,4 @@ val catch_break: bool -> unit
terminates the program or raises the [Break] exception.
Call [catch_break true] to enable raising [Break],
and [catch_break false] to let the system
- terminate the program on user interrupt. *)
+ terminate the program on user interrupt. *)