diff options
Diffstat (limited to 'otherlibs/win32unix')
-rw-r--r-- | otherlibs/win32unix/accept.c | 2 | ||||
-rw-r--r-- | otherlibs/win32unix/close_on.c | 12 | ||||
-rw-r--r-- | otherlibs/win32unix/connect.c | 2 | ||||
-rw-r--r-- | otherlibs/win32unix/createprocess.c | 4 | ||||
-rw-r--r-- | otherlibs/win32unix/sockopt.c | 2 | ||||
-rw-r--r-- | otherlibs/win32unix/unix.ml | 2 | ||||
-rw-r--r-- | otherlibs/win32unix/windir.c | 4 | ||||
-rw-r--r-- | otherlibs/win32unix/winwait.c | 2 |
8 files changed, 15 insertions, 15 deletions
diff --git a/otherlibs/win32unix/accept.c b/otherlibs/win32unix/accept.c index 21a07d710..6b6633b85 100644 --- a/otherlibs/win32unix/accept.c +++ b/otherlibs/win32unix/accept.c @@ -36,7 +36,7 @@ value unix_accept(sock) /* ML */ sock_addr_len = sizeof(sock_addr); enter_blocking_section(); s = accept((SOCKET) _get_osfhandle(Int_val(sock)), - &sock_addr.s_gen, &sock_addr_len); + &sock_addr.s_gen, &sock_addr_len); leave_blocking_section(); if (s == INVALID_SOCKET) { _dosmaperr(WSAGetLastError()); diff --git a/otherlibs/win32unix/close_on.c b/otherlibs/win32unix/close_on.c index 324c16209..179a5ae48 100644 --- a/otherlibs/win32unix/close_on.c +++ b/otherlibs/win32unix/close_on.c @@ -63,19 +63,19 @@ static int win_open_osfhandle2(handle, flags, reqd_fd) if (fd == -1) return -1; if (fd == reqd_fd) - return 0; /* Got it! */ + return 0; /* Got it! */ /* Make a copy of the handle, since we're going to close "handle" when we close "fd". */ if (! DuplicateHandle(GetCurrentProcess(), handle, - GetCurrentProcess(), &new_handle, - 0L, FALSE, DUPLICATE_SAME_ACCESS)) { + GetCurrentProcess(), &new_handle, + 0L, FALSE, DUPLICATE_SAME_ACCESS)) { _dosmaperr(GetLastError()); return -1; } /* Keep fd open during the recursive call, thus forcing _open_osfhandle to return reqd_fd eventually. */ retcode = win_open_osfhandle2(new_handle, flags, reqd_fd); - close(fd); /* Also closes "handle" */ + close(fd); /* Also closes "handle" */ return retcode; } @@ -86,8 +86,8 @@ static int win_set_noninherit(fd) oldh = (HANDLE) _get_osfhandle(fd); if (oldh == (HANDLE) -1) return -1; if (! DuplicateHandle(GetCurrentProcess(), oldh, - GetCurrentProcess(), &newh, - 0L, FALSE, DUPLICATE_SAME_ACCESS)) { + GetCurrentProcess(), &newh, + 0L, FALSE, DUPLICATE_SAME_ACCESS)) { _dosmaperr(GetLastError()); return -1; } diff --git a/otherlibs/win32unix/connect.c b/otherlibs/win32unix/connect.c index db2a9f66a..650d32b77 100644 --- a/otherlibs/win32unix/connect.c +++ b/otherlibs/win32unix/connect.c @@ -18,7 +18,7 @@ value unix_connect(socket, address) /* ML */ value socket, address; { - int retcode; + int retcode; get_sockaddr(address); enter_blocking_section(); diff --git a/otherlibs/win32unix/createprocess.c b/otherlibs/win32unix/createprocess.c index 9600cf0fe..64917ba75 100644 --- a/otherlibs/win32unix/createprocess.c +++ b/otherlibs/win32unix/createprocess.c @@ -47,8 +47,8 @@ value win_create_process_native(cmd, cmdline, env, fd1, fd2, fd3) } value win_create_process(argv, argn) /* ML */ - value * argv; - int argn; + value * argv; + int argn; { return win_create_process_native(argv[0], argv[1], argv[2], argv[3], argv[4], argv[5]); diff --git a/otherlibs/win32unix/sockopt.c b/otherlibs/win32unix/sockopt.c index a3832cb21..c858627a5 100644 --- a/otherlibs/win32unix/sockopt.c +++ b/otherlibs/win32unix/sockopt.c @@ -37,7 +37,7 @@ value unix_setsockopt(socket, option, status) /* ML */ int optval = Int_val(status); if (setsockopt(_get_osfhandle(Int_val(socket)), SOL_SOCKET, sockopt[Int_val(option)], - (char *) &optval, sizeof(optval)) == -1) + (char *) &optval, sizeof(optval)) == -1) uerror("setsockopt", Nothing); return Val_unit; } diff --git a/otherlibs/win32unix/unix.ml b/otherlibs/win32unix/unix.ml index aad503367..f07a67302 100644 --- a/otherlibs/win32unix/unix.ml +++ b/otherlibs/win32unix/unix.ml @@ -408,7 +408,7 @@ external win_create_process : string -> string -> string option -> let create_process prog args fd1 fd2 fd3 = win_create_process prog (String.concat " " (Array.to_list args)) None fd1 fd2 fd3 - + let create_process_env prog args env fd1 fd2 fd3 = win_create_process prog (String.concat " " (Array.to_list args)) (Some(String.concat "\000" (Array.to_list env) ^ "\000")) diff --git a/otherlibs/win32unix/windir.c b/otherlibs/win32unix/windir.c index df6b5aa13..0461c1e34 100644 --- a/otherlibs/win32unix/windir.c +++ b/otherlibs/win32unix/windir.c @@ -51,10 +51,10 @@ value win_findnext(valh) /* ML */ retcode = _findnext(Int_val(valh), &fileinfo); if (retcode != 0) raise_end_of_file(); return copy_string(fileinfo.name); -} +} value win_findclose(valh) /* ML */ - value valh; + value valh; { if (_findclose(Int_val(valh)) != 0) uerror("closedir", Nothing); return Val_unit; diff --git a/otherlibs/win32unix/winwait.c b/otherlibs/win32unix/winwait.c index ebba52ff4..16fbece8f 100644 --- a/otherlibs/win32unix/winwait.c +++ b/otherlibs/win32unix/winwait.c @@ -43,6 +43,6 @@ value win_waitpid(flags, vpid_req) /* ML */ int status, pid_req; pid_req = Int_val(vpid_req); if (_cwait(&status, pid_req, 0/* ignored by win32 */) == -1) - uerror("waitpid", Nothing); + uerror("waitpid", Nothing); return alloc_process_status(pid_req, status); } |