summaryrefslogtreecommitdiffstats
path: root/stdlib/sys.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/sys.mli')
-rw-r--r--stdlib/sys.mli18
1 files changed, 9 insertions, 9 deletions
diff --git a/stdlib/sys.mli b/stdlib/sys.mli
index 551e958a6..e1b871b08 100644
--- a/stdlib/sys.mli
+++ b/stdlib/sys.mli
@@ -24,34 +24,34 @@ val argv : string array
val executable_name : string
(** The name of the file containing the executable currently running. *)
-external file_exists : string -> bool = "sys_file_exists"
+external file_exists : string -> bool = "caml_sys_file_exists"
(** Test if a file with the given name exists. *)
-external remove : string -> unit = "sys_remove"
+external remove : string -> unit = "caml_sys_remove"
(** Remove the given file name from the file system. *)
-external rename : string -> string -> unit = "sys_rename"
+external rename : string -> string -> unit = "caml_sys_rename"
(** Rename a file. The first argument is the old name and the
second is the new name. *)
-external getenv : string -> string = "sys_getenv"
+external getenv : string -> string = "caml_sys_getenv"
(** Return the value associated to a variable in the process
environment. Raise [Not_found] if the variable is unbound. *)
-external command : string -> int = "sys_system_command"
+external command : string -> int = "caml_sys_system_command"
(** Execute the given shell command and return its exit code. *)
-external time : unit -> float = "sys_time"
+external time : unit -> float = "caml_sys_time"
(** Return the processor time, in seconds, used by the program
since the beginning of execution. *)
-external chdir : string -> unit = "sys_chdir"
+external chdir : string -> unit = "caml_sys_chdir"
(** Change the current working directory of the process. *)
-external getcwd : unit -> string = "sys_getcwd"
+external getcwd : unit -> string = "caml_sys_getcwd"
(** Return the current working directory of the process. *)
-external readdir : string -> string array = "sys_read_directory"
+external readdir : string -> string array = "caml_sys_read_directory"
(** Return the names of all files present in the given directory.
Names denoting the current directory and the parent directory
(["."] and [".."] in Unix) are not returned. Each string in the