1995-08-09 08:06:35 -07:00
|
|
|
(***********************************************************************)
|
|
|
|
(* *)
|
|
|
|
(* Caml Special Light *)
|
|
|
|
(* *)
|
|
|
|
(* Xavier Leroy, projet Cristal, INRIA Rocquencourt *)
|
|
|
|
(* *)
|
|
|
|
(* Copyright 1995 Institut National de Recherche en Informatique et *)
|
|
|
|
(* Automatique. Distributed only by permission. *)
|
|
|
|
(* *)
|
|
|
|
(***********************************************************************)
|
|
|
|
|
|
|
|
(* $Id$ *)
|
|
|
|
|
1995-05-08 08:18:32 -07:00
|
|
|
type error =
|
1996-04-12 08:57:28 -07:00
|
|
|
E2BIG
|
|
|
|
| EACCESS
|
1995-05-08 08:18:32 -07:00
|
|
|
| EAGAIN
|
1996-04-12 08:57:28 -07:00
|
|
|
| EBADF
|
1995-05-08 08:18:32 -07:00
|
|
|
| EBUSY
|
1996-04-12 08:57:28 -07:00
|
|
|
| ECHILD
|
|
|
|
| EDEADLK
|
|
|
|
| EDOM
|
1995-05-08 08:18:32 -07:00
|
|
|
| EEXIST
|
1996-04-12 08:57:28 -07:00
|
|
|
| EFAULT
|
|
|
|
| EFBIG
|
|
|
|
| EINTR
|
1995-05-08 08:18:32 -07:00
|
|
|
| EINVAL
|
1996-04-12 08:57:28 -07:00
|
|
|
| EIO
|
|
|
|
| EISDIR
|
1995-05-08 08:18:32 -07:00
|
|
|
| EMFILE
|
|
|
|
| EMLINK
|
1996-04-12 08:57:28 -07:00
|
|
|
| ENAMETOOLONG
|
|
|
|
| ENFILE
|
|
|
|
| ENODEV
|
|
|
|
| ENOENT
|
|
|
|
| ENOEXEC
|
|
|
|
| ENOLCK
|
|
|
|
| ENOMEM
|
|
|
|
| ENOSPC
|
|
|
|
| ENOSYS
|
|
|
|
| ENOTDIR
|
|
|
|
| ENOTEMPTY
|
|
|
|
| ENOTTY
|
|
|
|
| ENXIO
|
|
|
|
| EPERM
|
1995-05-08 08:18:32 -07:00
|
|
|
| EPIPE
|
|
|
|
| ERANGE
|
1996-04-12 08:57:28 -07:00
|
|
|
| EROFS
|
|
|
|
| ESPIPE
|
|
|
|
| ESRCH
|
|
|
|
| EXDEV
|
1995-05-08 08:18:32 -07:00
|
|
|
| EWOULDBLOCK
|
|
|
|
| EINPROGRESS
|
|
|
|
| EALREADY
|
|
|
|
| ENOTSOCK
|
|
|
|
| EDESTADDRREQ
|
|
|
|
| EMSGSIZE
|
|
|
|
| EPROTOTYPE
|
|
|
|
| ENOPROTOOPT
|
|
|
|
| EPROTONOSUPPORT
|
|
|
|
| ESOCKTNOSUPPORT
|
|
|
|
| EOPNOTSUPP
|
|
|
|
| EPFNOSUPPORT
|
|
|
|
| EAFNOSUPPORT
|
|
|
|
| EADDRINUSE
|
|
|
|
| EADDRNOTAVAIL
|
|
|
|
| ENETDOWN
|
|
|
|
| ENETUNREACH
|
|
|
|
| ENETRESET
|
|
|
|
| ECONNABORTED
|
|
|
|
| ECONNRESET
|
|
|
|
| ENOBUFS
|
|
|
|
| EISCONN
|
|
|
|
| ENOTCONN
|
|
|
|
| ESHUTDOWN
|
|
|
|
| ETOOMANYREFS
|
|
|
|
| ETIMEDOUT
|
|
|
|
| ECONNREFUSED
|
|
|
|
| EHOSTDOWN
|
|
|
|
| EHOSTUNREACH
|
1996-04-12 08:57:28 -07:00
|
|
|
| ELOOP
|
1995-05-08 08:18:32 -07:00
|
|
|
| EUNKNOWNERR
|
|
|
|
|
|
|
|
exception Unix_error of error * string * string
|
|
|
|
|
|
|
|
external register_unix_error: exn -> unit = "unix_register_error"
|
|
|
|
|
|
|
|
let _ = register_unix_error(Unix_error(EUNKNOWNERR, "", ""))
|
|
|
|
|
|
|
|
external error_message : error -> string = "unix_error_message"
|
|
|
|
|
|
|
|
let handle_unix_error f arg =
|
|
|
|
try
|
|
|
|
f arg
|
|
|
|
with Unix_error(err, fun_name, arg) ->
|
|
|
|
prerr_string Sys.argv.(0);
|
|
|
|
prerr_string ": \"";
|
|
|
|
prerr_string fun_name;
|
|
|
|
prerr_string "\" failed";
|
|
|
|
if String.length arg > 0 then begin
|
|
|
|
prerr_string " on \"";
|
|
|
|
prerr_string arg;
|
|
|
|
prerr_string "\""
|
|
|
|
end;
|
|
|
|
prerr_string ": ";
|
|
|
|
prerr_endline (error_message err);
|
|
|
|
exit 2
|
|
|
|
|
|
|
|
external environment : unit -> string array = "unix_environment"
|
|
|
|
|
|
|
|
type process_status =
|
|
|
|
WEXITED of int
|
1996-04-12 08:57:28 -07:00
|
|
|
| WSIGNALED of int
|
1995-05-08 08:18:32 -07:00
|
|
|
| WSTOPPED of int
|
|
|
|
|
|
|
|
type wait_flag =
|
|
|
|
WNOHANG
|
|
|
|
| WUNTRACED
|
|
|
|
|
|
|
|
external execv : string -> string array -> unit = "unix_execv"
|
|
|
|
external execve : string -> string array -> string array -> unit = "unix_execve"
|
|
|
|
external execvp : string -> string array -> unit = "unix_execvp"
|
|
|
|
external fork : unit -> int = "unix_fork"
|
|
|
|
external wait : unit -> int * process_status = "unix_wait"
|
|
|
|
external waitpid : wait_flag list -> int -> int * process_status = "unix_waitpid"
|
|
|
|
external getpid : unit -> int = "unix_getpid"
|
|
|
|
external getppid : unit -> int = "unix_getppid"
|
|
|
|
external nice : int -> int = "unix_nice"
|
|
|
|
|
|
|
|
type file_descr = int
|
|
|
|
|
|
|
|
let stdin = 0
|
|
|
|
let stdout = 1
|
|
|
|
let stderr = 2
|
|
|
|
|
|
|
|
type open_flag =
|
|
|
|
O_RDONLY
|
|
|
|
| O_WRONLY
|
|
|
|
| O_RDWR
|
1996-04-12 08:57:28 -07:00
|
|
|
| O_NONBLOCK
|
1995-05-08 08:18:32 -07:00
|
|
|
| O_APPEND
|
|
|
|
| O_CREAT
|
|
|
|
| O_TRUNC
|
|
|
|
| O_EXCL
|
|
|
|
|
|
|
|
type file_perm = int
|
|
|
|
|
|
|
|
|
|
|
|
external openfile : string -> open_flag list -> file_perm -> file_descr
|
|
|
|
= "unix_open"
|
|
|
|
external close : file_descr -> unit = "unix_close"
|
1996-03-05 02:12:41 -08:00
|
|
|
external unsafe_read : file_descr -> string -> int -> int -> int = "unix_read"
|
|
|
|
external unsafe_write : file_descr -> string -> int -> int -> int = "unix_write"
|
|
|
|
|
|
|
|
let read fd buf ofs len =
|
1996-03-14 01:37:54 -08:00
|
|
|
if len < 0 or ofs + len > String.length buf
|
1996-03-05 02:12:41 -08:00
|
|
|
then invalid_arg "Unix.read"
|
|
|
|
else unsafe_read fd buf ofs len
|
|
|
|
let write fd buf ofs len =
|
1996-03-14 01:37:54 -08:00
|
|
|
if len < 0 or ofs + len > String.length buf
|
1996-03-05 02:12:41 -08:00
|
|
|
then invalid_arg "Unix.write"
|
|
|
|
else unsafe_write fd buf ofs len
|
|
|
|
|
1995-05-08 08:18:32 -07:00
|
|
|
external in_channel_of_descr : file_descr -> in_channel = "open_descriptor"
|
|
|
|
external out_channel_of_descr : file_descr -> out_channel = "open_descriptor"
|
|
|
|
external descr_of_in_channel : in_channel -> file_descr = "channel_descriptor"
|
|
|
|
external descr_of_out_channel : out_channel -> file_descr = "channel_descriptor"
|
|
|
|
|
|
|
|
type seek_command =
|
|
|
|
SEEK_SET
|
|
|
|
| SEEK_CUR
|
|
|
|
| SEEK_END
|
|
|
|
|
|
|
|
external lseek : file_descr -> int -> seek_command -> int = "unix_lseek"
|
|
|
|
external truncate : string -> int -> unit = "unix_truncate"
|
|
|
|
external ftruncate : file_descr -> int -> unit = "unix_ftruncate"
|
|
|
|
|
|
|
|
type file_kind =
|
|
|
|
S_REG
|
|
|
|
| S_DIR
|
|
|
|
| S_CHR
|
|
|
|
| S_BLK
|
|
|
|
| S_LNK
|
|
|
|
| S_FIFO
|
|
|
|
| S_SOCK
|
|
|
|
|
|
|
|
type stats =
|
|
|
|
{ st_dev : int;
|
|
|
|
st_ino : int;
|
|
|
|
st_kind : file_kind;
|
|
|
|
st_perm : file_perm;
|
|
|
|
st_nlink : int;
|
|
|
|
st_uid : int;
|
|
|
|
st_gid : int;
|
|
|
|
st_rdev : int;
|
|
|
|
st_size : int;
|
|
|
|
st_atime : int;
|
|
|
|
st_mtime : int;
|
|
|
|
st_ctime : int }
|
|
|
|
|
|
|
|
external stat : string -> stats = "unix_stat"
|
|
|
|
external lstat : string -> stats = "unix_lstat"
|
|
|
|
external fstat : file_descr -> stats = "unix_fstat"
|
|
|
|
external unlink : string -> unit = "unix_unlink"
|
|
|
|
external rename : string -> string -> unit = "unix_rename"
|
|
|
|
external link : string -> string -> unit = "unix_link"
|
|
|
|
|
|
|
|
type access_permission =
|
|
|
|
R_OK
|
|
|
|
| W_OK
|
|
|
|
| X_OK
|
|
|
|
| F_OK
|
|
|
|
|
|
|
|
external chmod : string -> file_perm -> unit = "unix_chmod"
|
|
|
|
external fchmod : file_descr -> file_perm -> unit = "unix_fchmod"
|
|
|
|
external chown : string -> int -> int -> unit = "unix_chown"
|
|
|
|
external fchown : file_descr -> int -> int -> unit = "unix_fchown"
|
|
|
|
external umask : int -> int = "unix_umask"
|
|
|
|
external access : string -> access_permission list -> unit = "unix_access"
|
1996-04-12 08:57:28 -07:00
|
|
|
|
|
|
|
external dup : file_descr -> file_descr = "unix_dup"
|
|
|
|
external dup2 : file_descr -> file_descr -> unit = "unix_dup2"
|
|
|
|
external set_nonblock : file_descr -> unit = "unix_set_nonblock"
|
|
|
|
external clear_nonblock : file_descr -> unit = "unix_clear_nonblock"
|
|
|
|
external set_close_on_exec : file_descr -> unit = "unix_set_close_on_exec"
|
|
|
|
external clear_close_on_exec : file_descr -> unit = "unix_clear_close_on_exec"
|
|
|
|
|
1995-05-08 08:18:32 -07:00
|
|
|
external mkdir : string -> file_perm -> unit = "unix_mkdir"
|
|
|
|
external rmdir : string -> unit = "unix_rmdir"
|
|
|
|
external chdir : string -> unit = "unix_chdir"
|
|
|
|
external getcwd : unit -> string = "unix_getcwd"
|
|
|
|
|
|
|
|
type dir_handle
|
|
|
|
|
|
|
|
external opendir : string -> dir_handle = "unix_opendir"
|
|
|
|
external readdir : dir_handle -> string = "unix_readdir"
|
|
|
|
external rewinddir : dir_handle -> unit = "unix_rewinddir"
|
|
|
|
external closedir : dir_handle -> unit = "unix_closedir"
|
|
|
|
external pipe : unit -> file_descr * file_descr = "unix_pipe"
|
|
|
|
external symlink : string -> string -> unit = "unix_symlink"
|
|
|
|
external readlink : string -> string = "unix_readlink"
|
|
|
|
external mkfifo : string -> file_perm -> unit = "unix_mkfifo"
|
|
|
|
external ioctl_int : file_descr -> int -> int -> int = "unix_ioctl_int"
|
|
|
|
external ioctl_ptr : file_descr -> int -> string -> int = "unix_ioctl_ptr"
|
|
|
|
external select :
|
|
|
|
file_descr list -> file_descr list -> file_descr list -> float ->
|
|
|
|
file_descr list * file_descr list * file_descr list = "unix_select"
|
|
|
|
|
|
|
|
type lock_command =
|
|
|
|
F_ULOCK
|
|
|
|
| F_LOCK
|
|
|
|
| F_TLOCK
|
|
|
|
| F_TEST
|
|
|
|
|
|
|
|
external lockf : file_descr -> lock_command -> int -> unit = "unix_lockf"
|
|
|
|
external kill : int -> int -> unit = "unix_kill"
|
|
|
|
external pause : unit -> unit = "unix_pause"
|
|
|
|
|
|
|
|
type process_times =
|
|
|
|
{ tms_utime : float;
|
|
|
|
tms_stime : float;
|
|
|
|
tms_cutime : float;
|
|
|
|
tms_cstime : float }
|
|
|
|
|
|
|
|
type tm =
|
|
|
|
{ tm_sec : int;
|
|
|
|
tm_min : int;
|
|
|
|
tm_hour : int;
|
|
|
|
tm_mday : int;
|
|
|
|
tm_mon : int;
|
|
|
|
tm_year : int;
|
|
|
|
tm_wday : int;
|
|
|
|
tm_yday : int;
|
|
|
|
tm_isdst : bool }
|
|
|
|
|
|
|
|
external time : unit -> int = "unix_time"
|
1995-10-30 04:25:51 -08:00
|
|
|
external gettimeofday : unit -> float = "unix_gettimeofday"
|
1995-05-08 08:18:32 -07:00
|
|
|
external gmtime : int -> tm = "unix_gmtime"
|
|
|
|
external localtime : int -> tm = "unix_localtime"
|
|
|
|
external alarm : int -> int = "unix_alarm"
|
|
|
|
external sleep : int -> unit = "unix_sleep"
|
1995-12-15 02:19:58 -08:00
|
|
|
external times : unit -> process_times =
|
|
|
|
"unix_times_bytecode" "unix_times_native"
|
1995-05-08 08:18:32 -07:00
|
|
|
external utimes : string -> int -> int -> unit = "unix_utimes"
|
1996-04-12 08:57:28 -07:00
|
|
|
|
|
|
|
type interval_timer =
|
|
|
|
ITIMER_REAL
|
|
|
|
| ITIMER_VIRTUAL
|
|
|
|
| ITIMER_PROF
|
|
|
|
|
|
|
|
type interval_timer_status =
|
|
|
|
{ it_interval: float; (* Period *)
|
|
|
|
it_value: float } (* Current value of the timer *)
|
|
|
|
|
|
|
|
external getitimer: interval_timer -> interval_timer_status = "unix_getitimer"
|
|
|
|
external setitimer:
|
|
|
|
interval_timer -> interval_timer_status -> interval_timer_status
|
|
|
|
= "unix_setitimer"
|
|
|
|
|
1995-05-08 08:18:32 -07:00
|
|
|
external getuid : unit -> int = "unix_getuid"
|
|
|
|
external geteuid : unit -> int = "unix_geteuid"
|
|
|
|
external setuid : int -> unit = "unix_setuid"
|
|
|
|
external getgid : unit -> int = "unix_getgid"
|
|
|
|
external getegid : unit -> int = "unix_getegid"
|
|
|
|
external setgid : int -> unit = "unix_setgid"
|
|
|
|
external getgroups : unit -> int array = "unix_getgroups"
|
|
|
|
|
|
|
|
type passwd_entry =
|
|
|
|
{ pw_name : string;
|
|
|
|
pw_passwd : string;
|
|
|
|
pw_uid : int;
|
|
|
|
pw_gid : int;
|
|
|
|
pw_gecos : string;
|
|
|
|
pw_dir : string;
|
|
|
|
pw_shell : string }
|
|
|
|
|
|
|
|
type group_entry =
|
|
|
|
{ gr_name : string;
|
|
|
|
gr_passwd : string;
|
|
|
|
gr_gid : int;
|
|
|
|
gr_mem : string array }
|
|
|
|
|
|
|
|
|
|
|
|
external getlogin : unit -> string = "unix_getlogin"
|
|
|
|
external getpwnam : string -> passwd_entry = "unix_getpwnam"
|
|
|
|
external getgrnam : string -> group_entry = "unix_getgrnam"
|
|
|
|
external getpwuid : int -> passwd_entry = "unix_getpwuid"
|
|
|
|
external getgrgid : int -> group_entry = "unix_getgrgid"
|
|
|
|
|
|
|
|
type inet_addr
|
|
|
|
|
|
|
|
external inet_addr_of_string : string -> inet_addr
|
|
|
|
= "unix_inet_addr_of_string"
|
|
|
|
external string_of_inet_addr : inet_addr -> string
|
|
|
|
= "unix_string_of_inet_addr"
|
1996-04-12 08:57:28 -07:00
|
|
|
|
|
|
|
let inet_addr_any = inet_addr_of_string "0.0.0.0"
|
|
|
|
|
1995-05-08 08:18:32 -07:00
|
|
|
type socket_domain =
|
|
|
|
PF_UNIX
|
|
|
|
| PF_INET
|
|
|
|
|
|
|
|
type socket_type =
|
|
|
|
SOCK_STREAM
|
|
|
|
| SOCK_DGRAM
|
|
|
|
| SOCK_RAW
|
|
|
|
| SOCK_SEQPACKET
|
|
|
|
|
|
|
|
type sockaddr =
|
|
|
|
ADDR_UNIX of string
|
|
|
|
| ADDR_INET of inet_addr * int
|
|
|
|
|
|
|
|
type shutdown_command =
|
|
|
|
SHUTDOWN_RECEIVE
|
|
|
|
| SHUTDOWN_SEND
|
|
|
|
| SHUTDOWN_ALL
|
|
|
|
|
|
|
|
type msg_flag =
|
|
|
|
MSG_OOB
|
|
|
|
| MSG_DONTROUTE
|
|
|
|
| MSG_PEEK
|
|
|
|
|
1996-04-12 08:57:28 -07:00
|
|
|
type socket_option =
|
|
|
|
SO_DEBUG
|
|
|
|
| SO_BROADCAST
|
|
|
|
| SO_REUSEADDR
|
|
|
|
| SO_KEEPALIVE
|
|
|
|
| SO_DONTROUTE
|
|
|
|
| SO_OOBINLINE
|
|
|
|
|
1995-05-08 08:18:32 -07:00
|
|
|
external socket : socket_domain -> socket_type -> int -> file_descr
|
|
|
|
= "unix_socket"
|
|
|
|
external socketpair :
|
|
|
|
socket_domain -> socket_type -> int -> file_descr * file_descr
|
|
|
|
= "unix_socketpair"
|
|
|
|
external accept : file_descr -> file_descr * sockaddr = "unix_accept"
|
|
|
|
external bind : file_descr -> sockaddr -> unit = "unix_bind"
|
|
|
|
external connect : file_descr -> sockaddr -> unit = "unix_connect"
|
|
|
|
external listen : file_descr -> int -> unit = "unix_listen"
|
|
|
|
external shutdown : file_descr -> shutdown_command -> unit = "unix_shutdown"
|
1995-08-08 06:40:44 -07:00
|
|
|
external getsockname : file_descr -> sockaddr = "unix_getsockname"
|
|
|
|
external getpeername : file_descr -> sockaddr = "unix_getpeername"
|
1996-03-05 02:12:41 -08:00
|
|
|
|
|
|
|
external unsafe_recv :
|
|
|
|
file_descr -> string -> int -> int -> msg_flag list -> int
|
1995-05-08 08:18:32 -07:00
|
|
|
= "unix_recv"
|
1996-03-05 02:12:41 -08:00
|
|
|
external unsafe_recvfrom :
|
|
|
|
file_descr -> string -> int -> int -> msg_flag list -> int * sockaddr
|
1995-05-08 08:18:32 -07:00
|
|
|
= "unix_recvfrom"
|
1996-03-05 02:12:41 -08:00
|
|
|
external unsafe_send :
|
|
|
|
file_descr -> string -> int -> int -> msg_flag list -> int
|
1995-05-08 08:18:32 -07:00
|
|
|
= "unix_send"
|
1996-03-05 02:12:41 -08:00
|
|
|
external unsafe_sendto :
|
|
|
|
file_descr -> string -> int -> int -> msg_flag list -> sockaddr -> int
|
1995-10-23 09:58:06 -07:00
|
|
|
= "unix_sendto" "unix_sendto_native"
|
1995-05-08 08:18:32 -07:00
|
|
|
|
1996-03-05 02:12:41 -08:00
|
|
|
let recv fd buf ofs len flags =
|
1996-03-14 01:37:54 -08:00
|
|
|
if len < 0 or ofs + len > String.length buf
|
1996-03-05 02:12:41 -08:00
|
|
|
then invalid_arg "Unix.recv"
|
|
|
|
else unsafe_recv fd buf ofs len flags
|
|
|
|
let recvfrom fd buf ofs len flags =
|
1996-03-14 01:37:54 -08:00
|
|
|
if len < 0 or ofs + len > String.length buf
|
1996-03-05 02:12:41 -08:00
|
|
|
then invalid_arg "Unix.recvfrom"
|
|
|
|
else unsafe_recvfrom fd buf ofs len flags
|
|
|
|
let send fd buf ofs len flags =
|
1996-03-14 01:37:54 -08:00
|
|
|
if len < 0 or ofs + len > String.length buf
|
1996-03-05 02:12:41 -08:00
|
|
|
then invalid_arg "Unix.send"
|
|
|
|
else unsafe_send fd buf ofs len flags
|
|
|
|
let sendto fd buf ofs len flags addr =
|
1996-03-14 01:37:54 -08:00
|
|
|
if len < 0 or ofs + len > String.length buf
|
1996-03-05 02:12:41 -08:00
|
|
|
then invalid_arg "Unix.sendto"
|
|
|
|
else unsafe_sendto fd buf ofs len flags addr
|
|
|
|
|
1996-04-12 08:57:28 -07:00
|
|
|
external getsockopt : file_descr -> socket_option -> bool = "unix_getsockopt"
|
|
|
|
external setsockopt : file_descr -> socket_option -> bool -> unit
|
|
|
|
= "unix_setsockopt"
|
1995-05-08 08:18:32 -07:00
|
|
|
type host_entry =
|
|
|
|
{ h_name : string;
|
|
|
|
h_aliases : string array;
|
|
|
|
h_addrtype : socket_domain;
|
|
|
|
h_addr_list : inet_addr array }
|
|
|
|
|
|
|
|
type protocol_entry =
|
|
|
|
{ p_name : string;
|
|
|
|
p_aliases : string array;
|
|
|
|
p_proto : int }
|
|
|
|
|
|
|
|
type service_entry =
|
|
|
|
{ s_name : string;
|
|
|
|
s_aliases : string array;
|
|
|
|
s_port : int;
|
|
|
|
s_proto : string }
|
|
|
|
|
|
|
|
external gethostname : unit -> string = "unix_gethostname"
|
|
|
|
external gethostbyname : string -> host_entry = "unix_gethostbyname"
|
|
|
|
external gethostbyaddr : inet_addr -> host_entry = "unix_gethostbyaddr"
|
|
|
|
external getprotobyname : string -> protocol_entry
|
|
|
|
= "unix_getprotobyname"
|
|
|
|
external getprotobynumber : int -> protocol_entry
|
|
|
|
= "unix_getprotobynumber"
|
|
|
|
external getservbyname : string -> string -> service_entry
|
|
|
|
= "unix_getservbyname"
|
|
|
|
external getservbyport : int -> string -> service_entry
|
|
|
|
= "unix_getservbyport"
|
|
|
|
type terminal_io = {
|
|
|
|
mutable c_ignbrk: bool;
|
|
|
|
mutable c_brkint: bool;
|
|
|
|
mutable c_ignpar: bool;
|
|
|
|
mutable c_parmrk: bool;
|
|
|
|
mutable c_inpck: bool;
|
|
|
|
mutable c_istrip: bool;
|
|
|
|
mutable c_inlcr: bool;
|
|
|
|
mutable c_igncr: bool;
|
|
|
|
mutable c_icrnl: bool;
|
|
|
|
mutable c_ixon: bool;
|
|
|
|
mutable c_ixoff: bool;
|
|
|
|
mutable c_opost: bool;
|
|
|
|
mutable c_obaud: int;
|
|
|
|
mutable c_ibaud: int;
|
|
|
|
mutable c_csize: int;
|
|
|
|
mutable c_cstopb: int;
|
|
|
|
mutable c_cread: bool;
|
|
|
|
mutable c_parenb: bool;
|
|
|
|
mutable c_parodd: bool;
|
|
|
|
mutable c_hupcl: bool;
|
|
|
|
mutable c_clocal: bool;
|
|
|
|
mutable c_isig: bool;
|
|
|
|
mutable c_icanon: bool;
|
|
|
|
mutable c_noflsh: bool;
|
|
|
|
mutable c_echo: bool;
|
|
|
|
mutable c_echoe: bool;
|
|
|
|
mutable c_echok: bool;
|
|
|
|
mutable c_echonl: bool;
|
|
|
|
mutable c_vintr: char;
|
|
|
|
mutable c_vquit: char;
|
|
|
|
mutable c_verase: char;
|
|
|
|
mutable c_vkill: char;
|
|
|
|
mutable c_veof: char;
|
|
|
|
mutable c_veol: char;
|
|
|
|
mutable c_vmin: int;
|
|
|
|
mutable c_vtime: int;
|
|
|
|
mutable c_vstart: char;
|
|
|
|
mutable c_vstop: char
|
|
|
|
}
|
|
|
|
|
|
|
|
external tcgetattr: file_descr -> terminal_io = "unix_tcgetattr"
|
|
|
|
|
|
|
|
type setattr_when = TCSANOW | TCSADRAIN | TCSAFLUSH
|
|
|
|
|
|
|
|
external tcsetattr: file_descr -> setattr_when -> terminal_io -> unit
|
|
|
|
= "unix_tcsetattr"
|
|
|
|
external tcsendbreak: file_descr -> int -> unit = "unix_tcsendbreak"
|
|
|
|
external tcdrain: file_descr -> unit = "unix_tcdrain"
|
|
|
|
|
|
|
|
type flush_queue = TCIFLUSH | TCOFLUSH | TCIOFLUSH
|
|
|
|
|
|
|
|
external tcflush: file_descr -> flush_queue -> unit = "unix_tcflush"
|
|
|
|
|
|
|
|
type flow_action = TCOOFF | TCOON | TCIOFF | TCION
|
|
|
|
|
|
|
|
external tcflow: file_descr -> flow_action -> unit = "unix_tcflow"
|
|
|
|
|
|
|
|
(* High-level process management (system, popen) *)
|
|
|
|
|
|
|
|
let system cmd =
|
|
|
|
match fork() with
|
|
|
|
0 -> execv "/bin/sh" [| "/bin/sh"; "-c"; cmd |]; exit 127
|
|
|
|
| id -> snd(waitpid [] id)
|
|
|
|
|
|
|
|
type popen_process =
|
|
|
|
Process of in_channel * out_channel
|
|
|
|
| Process_in of in_channel
|
|
|
|
| Process_out of out_channel
|
|
|
|
|
|
|
|
let popen_processes = (Hashtbl.new 7 : (popen_process, int) Hashtbl.t)
|
|
|
|
|
1996-04-12 08:57:28 -07:00
|
|
|
let open_proc cmd proc input output toclose =
|
1995-05-08 08:18:32 -07:00
|
|
|
match fork() with
|
|
|
|
0 -> if input <> stdin then begin dup2 input stdin; close input end;
|
|
|
|
if output <> stdout then begin dup2 output stdout; close output end;
|
1996-04-12 08:57:28 -07:00
|
|
|
List.iter close toclose;
|
1995-05-08 08:18:32 -07:00
|
|
|
execv "/bin/sh" [| "/bin/sh"; "-c"; cmd |];
|
|
|
|
exit 127
|
|
|
|
| id -> Hashtbl.add popen_processes proc id
|
|
|
|
|
|
|
|
let open_process_in cmd =
|
|
|
|
let (in_read, in_write) = pipe() in
|
|
|
|
let inchan = in_channel_of_descr in_read in
|
1996-04-12 08:57:28 -07:00
|
|
|
open_proc cmd (Process_in inchan) stdin in_write [in_read];
|
1995-09-14 04:53:33 -07:00
|
|
|
close in_write;
|
|
|
|
inchan
|
1995-05-08 08:18:32 -07:00
|
|
|
|
|
|
|
let open_process_out cmd =
|
|
|
|
let (out_read, out_write) = pipe() in
|
|
|
|
let outchan = out_channel_of_descr out_write in
|
1996-04-12 08:57:28 -07:00
|
|
|
open_proc cmd (Process_out outchan) out_read stdout [out_write];
|
1995-09-14 04:53:33 -07:00
|
|
|
close out_read;
|
|
|
|
outchan
|
1995-05-08 08:18:32 -07:00
|
|
|
|
|
|
|
let open_process cmd =
|
|
|
|
let (in_read, in_write) = pipe() in
|
|
|
|
let (out_read, out_write) = pipe() in
|
|
|
|
let inchan = in_channel_of_descr in_read in
|
|
|
|
let outchan = out_channel_of_descr out_write in
|
1996-04-12 08:57:28 -07:00
|
|
|
open_proc cmd (Process(inchan, outchan))
|
|
|
|
out_read in_write [in_read; out_write];
|
|
|
|
(inchan, outchan)
|
1995-05-08 08:18:32 -07:00
|
|
|
|
1996-04-12 08:57:28 -07:00
|
|
|
let find_proc_id fun_name proc =
|
1995-05-08 08:18:32 -07:00
|
|
|
try
|
1996-04-12 08:57:28 -07:00
|
|
|
let pid = Hashtbl.find popen_processes proc in
|
1995-05-08 08:18:32 -07:00
|
|
|
Hashtbl.remove popen_processes proc;
|
1996-04-12 08:57:28 -07:00
|
|
|
pid
|
1995-05-08 08:18:32 -07:00
|
|
|
with Not_found ->
|
|
|
|
raise(Unix_error(EBADF, fun_name, ""))
|
|
|
|
|
|
|
|
let close_process_in inchan =
|
1996-04-12 08:57:28 -07:00
|
|
|
let pid = find_proc_id "close_process_in" (Process_in inchan) in
|
|
|
|
close_in inchan;
|
|
|
|
snd(waitpid [] pid)
|
1995-05-08 08:18:32 -07:00
|
|
|
|
|
|
|
let close_process_out outchan =
|
1996-04-12 08:57:28 -07:00
|
|
|
let pid = find_proc_id "close_process_out" (Process_out outchan) in
|
1995-05-08 08:18:32 -07:00
|
|
|
close_out outchan;
|
1996-04-12 08:57:28 -07:00
|
|
|
snd(waitpid [] pid)
|
1995-05-08 08:18:32 -07:00
|
|
|
|
|
|
|
let close_process (inchan, outchan) =
|
1996-04-12 08:57:28 -07:00
|
|
|
let pid = find_proc_id "close_process" (Process(inchan, outchan)) in
|
|
|
|
close_in inchan; close_out outchan;
|
|
|
|
snd(waitpid [] pid)
|
1995-05-08 08:18:32 -07:00
|
|
|
|
|
|
|
(* High-level network functions *)
|
|
|
|
|
|
|
|
let open_connection sockaddr =
|
|
|
|
let domain =
|
|
|
|
match sockaddr with ADDR_UNIX _ -> PF_UNIX | ADDR_INET(_,_) -> PF_INET in
|
|
|
|
let sock =
|
|
|
|
socket domain SOCK_STREAM 0 in
|
|
|
|
connect sock sockaddr;
|
|
|
|
(in_channel_of_descr sock, out_channel_of_descr sock)
|
|
|
|
|
|
|
|
let shutdown_connection inchan =
|
|
|
|
shutdown (descr_of_in_channel inchan) SHUTDOWN_SEND
|
|
|
|
|
|
|
|
let establish_server server_fun sockaddr =
|
|
|
|
let domain =
|
|
|
|
match sockaddr with ADDR_UNIX _ -> PF_UNIX | ADDR_INET(_,_) -> PF_INET in
|
|
|
|
let sock =
|
|
|
|
socket domain SOCK_STREAM 0 in
|
|
|
|
bind sock sockaddr;
|
|
|
|
listen sock 3;
|
|
|
|
while true do
|
|
|
|
let (s, caller) = accept sock in
|
|
|
|
(* The "double fork" trick, the process which calls server_fun will not
|
|
|
|
leave a zombie process *)
|
|
|
|
match fork() with
|
1996-04-12 08:57:28 -07:00
|
|
|
0 -> if fork() <> 0 then exit 0; (* The son exits, the grandson works *)
|
1995-05-08 08:18:32 -07:00
|
|
|
let inchan = in_channel_of_descr s in
|
|
|
|
let outchan = out_channel_of_descr s in
|
|
|
|
server_fun inchan outchan;
|
|
|
|
close_in inchan;
|
|
|
|
close_out outchan
|
|
|
|
| id -> close s; waitpid [] id (* Reclaim the son *); ()
|
|
|
|
done
|