]> git.lizzy.rs Git - rust.git/blobdiff - src/libstd/run.rs
Revert "auto merge of #8645 : alexcrichton/rust/issue-6436-run-non-blocking, r=brson"
[rust.git] / src / libstd / run.rs
index b91aac2224401a532dcd9f54afda9ceb7f8a144f..7fc2deff97d8bd34538c1d3c4a236c05dcba0c03 100644 (file)
 
 //! Process spawning.
 
+#[allow(missing_doc)];
+
+use c_str::ToCStr;
 use cast;
-use cell::Cell;
+use clone::Clone;
 use comm::{stream, SharedChan, GenericChan, GenericPort};
-#[cfg(not(windows))]
+use io;
+use libc::{pid_t, c_void, c_int};
 use libc;
-use libc::{pid_t, c_int};
+use option::{Some, None};
+use os;
 use prelude::*;
+use ptr;
 use task;
 use vec::ImmutableVector;
 
-use rt::io;
-use rt::local::Local;
-use rt::rtio::{IoFactoryObject, RtioProcessObject, RtioProcess, IoFactory};
-use rt::uv::process;
-
 /**
  * A value representing a child process.
  *
  * for the process to terminate.
  */
 pub struct Process {
+
     /// The unique id of the process (this should never be negative).
     priv pid: pid_t,
 
-    /// The internal handle to the underlying libuv process.
-    priv handle: ~RtioProcessObject,
+    /**
+     * A handle to the process - on unix this will always be NULL, but on
+     * windows it will be a HANDLE to the process, which will prevent the
+     * pid being re-used until the handle is closed.
+     */
+    priv handle: *(),
 
-    /// Some(fd), or None when stdin is being redirected from a fd not created
-    /// by Process::new.
-    priv input: Option<~io::Writer>,
+    /// Some(fd), or None when stdin is being redirected from a fd not created by Process::new.
+    priv input: Option<c_int>,
 
-    /// Some(file), or None when stdout is being redirected to a fd not created
-    /// by Process::new.
-    priv output: Option<~io::Reader>,
+    /// Some(file), or None when stdout is being redirected to a fd not created by Process::new.
+    priv output: Option<*libc::FILE>,
 
-    /// Some(file), or None when stderr is being redirected to a fd not created
-    /// by Process::new.
-    priv error: Option<~io::Reader>,
+    /// Some(file), or None when stderr is being redirected to a fd not created by Process::new.
+    priv error: Option<*libc::FILE>,
+
+    /// None until finish() is called.
+    priv exit_code: Option<int>,
 }
 
 /// Options that can be given when starting a Process.
@@ -87,27 +93,26 @@ pub struct ProcessOptions<'self> {
      * If this is None then a new pipe will be created for the new program's
      * output and Process.output() will provide a Reader to read from this pipe.
      *
-     * If this is Some(file-descriptor) then the new process will write its
-     * output to the given file descriptor, Process.output_redirected() will
-     * return true, and Process.output() will fail.
+     * If this is Some(file-descriptor) then the new process will write its output
+     * to the given file descriptor, Process.output_redirected() will return
+     * true, and Process.output() will fail.
      */
     out_fd: Option<c_int>,
 
     /**
-     * If this is None then a new pipe will be created for the new progam's
-     * error stream and Process.error() will provide a Reader to read from this
-     * pipe.
+     * If this is None then a new pipe will be created for the new program's
+     * error stream and Process.error() will provide a Reader to read from this pipe.
      *
-     * If this is Some(file-descriptor) then the new process will write its
-     * error output to the given file descriptor, Process.error_redirected()
-     * will return true, and and Process.error() will fail.
+     * If this is Some(file-descriptor) then the new process will write its error output
+     * to the given file descriptor, Process.error_redirected() will return true, and
+     * and Process.error() will fail.
      */
     err_fd: Option<c_int>,
 }
 
-impl<'self> ProcessOptions<'self> {
+impl <'self> ProcessOptions<'self> {
     /// Return a ProcessOptions that has None in every field.
-    pub fn new() -> ProcessOptions {
+    pub fn new<'a>() -> ProcessOptions<'a> {
         ProcessOptions {
             env: None,
             dir: None,
@@ -120,6 +125,7 @@ pub fn new() -> ProcessOptions {
 
 /// The output of a finished process.
 pub struct ProcessOutput {
+
     /// The status (exit code) of the process.
     status: int,
 
@@ -142,159 +148,223 @@ impl Process {
      *             the working directory and the standard IO streams.
      */
     pub fn new(prog: &str, args: &[~str],
-               options: ProcessOptions) -> Option<Process> {
-        // First, translate all the stdio options into their libuv equivalents
-        let (uv_stdin, stdin) = match options.in_fd {
-            Some(fd) => (process::InheritFd(fd), None),
+               options: ProcessOptions)
+               -> Process {
+        #[fixed_stack_segment]; #[inline(never)];
+
+        let (in_pipe, in_fd) = match options.in_fd {
             None => {
-                let p = io::pipe::PipeStream::new().expect("need stdin pipe");
-                (process::CreatePipe(p.uv_pipe(), true, false),
-                 Some(~p as ~io::Writer))
-            }
+                let pipe = os::pipe();
+                (Some(pipe), pipe.input)
+            },
+            Some(fd) => (None, fd)
         };
-        let (uv_stdout, stdout) = match options.out_fd {
-            Some(fd) => (process::InheritFd(fd), None),
+        let (out_pipe, out_fd) = match options.out_fd {
             None => {
-                let p = io::pipe::PipeStream::new().expect("need stdout pipe");
-                (process::CreatePipe(p.uv_pipe(), false, true),
-                 Some(~p as ~io::Reader))
-            }
+                let pipe = os::pipe();
+                (Some(pipe), pipe.out)
+            },
+            Some(fd) => (None, fd)
         };
-        let (uv_stderr, stderr) = match options.err_fd {
-            Some(fd) => (process::InheritFd(fd), None),
+        let (err_pipe, err_fd) = match options.err_fd {
             None => {
-                let p = io::pipe::PipeStream::new().expect("need stderr pipe");
-                (process::CreatePipe(p.uv_pipe(), false, true),
-                 Some(~p as ~io::Reader))
-            }
+                let pipe = os::pipe();
+                (Some(pipe), pipe.out)
+            },
+            Some(fd) => (None, fd)
         };
 
-        // Next, massage our options into the libuv options
-        let dir = options.dir.map(|d| d.to_str());
-        let dir = dir.map(|d| d.as_slice());
-        let config = process::Config {
-            program: prog,
-            args: args,
-            env: options.env.map(|e| e.as_slice()),
-            cwd: dir,
-            io: [uv_stdin, uv_stdout, uv_stderr],
-        };
+        let res = spawn_process_os(prog, args, options.env.clone(), options.dir,
+                                   in_fd, out_fd, err_fd);
 
-        // Finally, actually spawn the process
         unsafe {
-            let io: *mut IoFactoryObject = Local::unsafe_borrow();
-            match (*io).spawn(&config) {
-                Ok(handle) => {
-                    Some(Process {
-                        pid: handle.id(),
-                        handle: handle,
-                        input: stdin,
-                        output: stdout,
-                        error: stderr,
-                    })
-                }
-                Err(*) => { None }
-            }
+            for pipe in in_pipe.iter() { libc::close(pipe.input); }
+            for pipe in out_pipe.iter() { libc::close(pipe.out); }
+            for pipe in err_pipe.iter() { libc::close(pipe.out); }
+        }
+
+        Process {
+            pid: res.pid,
+            handle: res.handle,
+            input: in_pipe.map(|pipe| pipe.out),
+            output: out_pipe.map(|pipe| os::fdopen(pipe.input)),
+            error: err_pipe.map(|pipe| os::fdopen(pipe.input)),
+            exit_code: None,
         }
     }
 
     /// Returns the unique id of the process
     pub fn get_id(&self) -> pid_t { self.pid }
 
+    fn input_fd(&mut self) -> c_int {
+        match self.input {
+            Some(fd) => fd,
+            None => fail!("This Process's stdin was redirected to an \
+                           existing file descriptor.")
+        }
+    }
+
+    fn output_file(&mut self) -> *libc::FILE {
+        match self.output {
+            Some(file) => file,
+            None => fail!("This Process's stdout was redirected to an \
+                           existing file descriptor.")
+        }
+    }
+
+    fn error_file(&mut self) -> *libc::FILE {
+        match self.error {
+            Some(file) => file,
+            None => fail!("This Process's stderr was redirected to an \
+                           existing file descriptor.")
+        }
+    }
+
     /**
-     * Returns a rt::io::Writer that can be used to write to this Process's
-     * stdin.
+     * Returns whether this process is reading its stdin from an existing file
+     * descriptor rather than a pipe that was created specifically for this
+     * process.
      *
-     * Fails if this Process's stdin was redirected to an existing file
-     * descriptor.
+     * If this method returns true then self.input() will fail.
      */
-    pub fn input<'a>(&'a mut self) -> &'a mut io::Writer {
-        let ret: &mut io::Writer = *self.input.get_mut_ref();
-        return ret;
+    pub fn input_redirected(&self) -> bool {
+        self.input.is_none()
     }
 
     /**
-     * Returns a rt::io::Reader that can be used to read from this Process's
-     * stdout.
+     * Returns whether this process is writing its stdout to an existing file
+     * descriptor rather than a pipe that was created specifically for this
+     * process.
      *
-     * Fails if this Process's stdout was redirected to an existing file
-     * descriptor.
+     * If this method returns true then self.output() will fail.
      */
-    pub fn output<'a>(&'a mut self) -> &'a mut io::Reader {
-        let ret: &mut io::Reader = *self.output.get_mut_ref();
-        return ret;
+    pub fn output_redirected(&self) -> bool {
+        self.output.is_none()
     }
 
     /**
-     * Returns a rt::io::Reader that can be used to read from this Process's
-     * stderr.
+     * Returns whether this process is writing its stderr to an existing file
+     * descriptor rather than a pipe that was created specifically for this
+     * process.
      *
-     * Fails if this Process's stderr was redirected to an existing file
-     * descriptor.
+     * If this method returns true then self.error() will fail.
      */
-    pub fn error<'a>(&'a mut self) -> &'a mut io::Reader {
-        let ret: &mut io::Reader = *self.error.get_mut_ref();
-        return ret;
+    pub fn error_redirected(&self) -> bool {
+        self.error.is_none()
     }
 
     /**
-     * Closes the handle to stdin, waits for the child process to terminate, and
-     * returns the exit code.
+     * Returns an io::Writer that can be used to write to this Process's stdin.
      *
-     * If the child has already been finished then the exit code is returned.
+     * Fails if this Process's stdin was redirected to an existing file descriptor.
      */
-    pub fn finish(&mut self) -> int {
-        // We're not going to be giving any more input, so close the input by
-        // destroying it. Also, if the output is desired, then
-        // finish_with_output is called so we discard all the outputs here. Note
-        // that the process may not terminate if we don't destroy stdio because
-        // it'll be waiting in a write which we'll just never read.
-        self.input.take();
-        self.output.take();
-        self.error.take();
+    pub fn input(&mut self) -> @io::Writer {
+        // FIXME: the Writer can still be used after self is destroyed: #2625
+       io::fd_writer(self.input_fd(), false)
+    }
 
-        self.handle.wait()
+    /**
+     * Returns an io::Reader that can be used to read from this Process's stdout.
+     *
+     * Fails if this Process's stdout was redirected to an existing file descriptor.
+     */
+    pub fn output(&mut self) -> @io::Reader {
+        // FIXME: the Reader can still be used after self is destroyed: #2625
+        io::FILE_reader(self.output_file(), false)
     }
 
     /**
-     * Closes the handle to stdin, waits for the child process to terminate,
-     * and reads and returns all remaining output of stdout and stderr, along
-     * with the exit code.
+     * Returns an io::Reader that can be used to read from this Process's stderr.
      *
-     * If the child has already been finished then the exit code and any
-     * remaining unread output of stdout and stderr will be returned.
+     * Fails if this Process's stderr was redirected to an existing file descriptor.
+     */
+    pub fn error(&mut self) -> @io::Reader {
+        // FIXME: the Reader can still be used after self is destroyed: #2625
+        io::FILE_reader(self.error_file(), false)
+    }
+
+    /**
+     * Closes the handle to the child process's stdin.
      *
-     * This method will fail if the child process's stdout or stderr streams
-     * were redirected to existing file descriptors, or if this method has
-     * already been called.
+     * If this process is reading its stdin from an existing file descriptor, then this
+     * method does nothing.
      */
-    pub fn finish_with_output(&mut self) -> ProcessOutput {
-        // This should probably be a helper method in rt::io
-        fn read_everything(input: &mut io::Reader) -> ~[u8] {
-            let mut result = ~[];
-            let mut buf = [0u8, ..1024];
-            loop {
-                match input.read(buf) {
-                    Some(i) => { result = result + buf.slice_to(i) }
-                    None => break
+    pub fn close_input(&mut self) {
+        #[fixed_stack_segment]; #[inline(never)];
+        match self.input {
+            Some(-1) | None => (),
+            Some(fd) => {
+                unsafe {
+                    libc::close(fd);
                 }
+                self.input = Some(-1);
             }
-            return result;
         }
+    }
+
+    fn close_outputs(&mut self) {
+        #[fixed_stack_segment]; #[inline(never)];
+        fclose_and_null(&mut self.output);
+        fclose_and_null(&mut self.error);
+
+        fn fclose_and_null(f_opt: &mut Option<*libc::FILE>) {
+            #[allow(cstack)]; // fixed_stack_segment declared on enclosing fn
+            match *f_opt {
+                Some(f) if !f.is_null() => {
+                    unsafe {
+                        libc::fclose(f);
+                        *f_opt = Some(0 as *libc::FILE);
+                    }
+                },
+                _ => ()
+            }
+        }
+    }
+
+    /**
+     * Closes the handle to stdin, waits for the child process to terminate,
+     * and returns the exit code.
+     *
+     * If the child has already been finished then the exit code is returned.
+     */
+    pub fn finish(&mut self) -> int {
+        for &code in self.exit_code.iter() {
+            return code;
+        }
+        self.close_input();
+        let code = waitpid(self.pid);
+        self.exit_code = Some(code);
+        return code;
+    }
 
+    /**
+     * Closes the handle to stdin, waits for the child process to terminate, and reads
+     * and returns all remaining output of stdout and stderr, along with the exit code.
+     *
+     * If the child has already been finished then the exit code and any remaining
+     * unread output of stdout and stderr will be returned.
+     *
+     * This method will fail if the child process's stdout or stderr streams were
+     * redirected to existing file descriptors.
+     */
+    pub fn finish_with_output(&mut self) -> ProcessOutput {
+        let output_file = self.output_file();
+        let error_file = self.error_file();
+
+        // Spawn two entire schedulers to read both stdout and sterr
+        // in parallel so we don't deadlock while blocking on one
+        // or the other. FIXME (#2625): Surely there's a much more
+        // clever way to do this.
         let (p, ch) = stream();
         let ch = SharedChan::new(ch);
         let ch_clone = ch.clone();
-
-        let stderr = Cell::new(self.error.take().unwrap());
-        do task::spawn {
-            let output = read_everything(stderr.take());
-            ch.send((2, output));
+        do task::spawn_sched(task::SingleThreaded) {
+            let errput = io::FILE_reader(error_file, false);
+            ch.send((2, errput.read_whole_stream()));
         }
-        let stdout = Cell::new(self.output.take().unwrap());
-        do task::spawn {
-            let output = read_everything(stdout.take());
-            ch_clone.send((1, output));
+        do task::spawn_sched(task::SingleThreaded) {
+            let output = io::FILE_reader(output_file, false);
+            ch_clone.send((1, output.read_whole_stream()));
         }
 
         let status = self.finish();
@@ -312,6 +382,40 @@ fn read_everything(input: &mut io::Reader) -> ~[u8] {
                               error: errs};
     }
 
+    fn destroy_internal(&mut self, force: bool) {
+        // if the process has finished, and therefore had waitpid called,
+        // and we kill it, then on unix we might ending up killing a
+        // newer process that happens to have the same (re-used) id
+        if self.exit_code.is_none() {
+            killpid(self.pid, force);
+            self.finish();
+        }
+
+        #[cfg(windows)]
+        fn killpid(pid: pid_t, _force: bool) {
+            #[fixed_stack_segment]; #[inline(never)];
+            unsafe {
+                libc::funcs::extra::kernel32::TerminateProcess(
+                    cast::transmute(pid), 1);
+            }
+        }
+
+        #[cfg(unix)]
+        fn killpid(pid: pid_t, force: bool) {
+            #[fixed_stack_segment]; #[inline(never)];
+
+            let signal = if force {
+                libc::consts::os::posix88::SIGKILL
+            } else {
+                libc::consts::os::posix88::SIGTERM
+            };
+
+            unsafe {
+                libc::funcs::posix88::signal::kill(pid, signal as c_int);
+            }
+        }
+    }
+
     /**
      * Terminates the process, giving it a chance to clean itself up if
      * this is supported by the operating system.
@@ -319,12 +423,7 @@ fn read_everything(input: &mut io::Reader) -> ~[u8] {
      * On Posix OSs SIGTERM will be sent to the process. On Win32
      * TerminateProcess(..) will be called.
      */
-    pub fn destroy(&mut self) {
-        #[cfg(windows)]      fn sigterm() -> int { 15 }
-        #[cfg(not(windows))] fn sigterm() -> int { libc::SIGTERM as int }
-        self.handle.kill(sigterm());
-        self.finish();
-    }
+    pub fn destroy(&mut self) { self.destroy_internal(false); }
 
     /**
      * Terminates the process as soon as possible without giving it a
@@ -333,22 +432,378 @@ pub fn destroy(&mut self) {
      * On Posix OSs SIGKILL will be sent to the process. On Win32
      * TerminateProcess(..) will be called.
      */
-    pub fn force_destroy(&mut self) {
-        #[cfg(windows)]      fn sigkill() -> int { 9 }
-        #[cfg(not(windows))] fn sigkill() -> int { libc::SIGKILL as int }
-        self.handle.kill(sigkill());
-        self.finish();
-    }
+    pub fn force_destroy(&mut self) { self.destroy_internal(true); }
 }
 
 impl Drop for Process {
     fn drop(&self) {
         // FIXME(#4330) Need self by value to get mutability.
         let mut_self: &mut Process = unsafe { cast::transmute(self) };
+
         mut_self.finish();
+        mut_self.close_outputs();
+        free_handle(self.handle);
+    }
+}
+
+struct SpawnProcessResult {
+    pid: pid_t,
+    handle: *(),
+}
+
+#[cfg(windows)]
+fn spawn_process_os(prog: &str, args: &[~str],
+                    env: Option<~[(~str, ~str)]>,
+                    dir: Option<&Path>,
+                    in_fd: c_int, out_fd: c_int, err_fd: c_int) -> SpawnProcessResult {
+    #[fixed_stack_segment]; #[inline(never)];
+
+    use libc::types::os::arch::extra::{DWORD, HANDLE, STARTUPINFO};
+    use libc::consts::os::extra::{
+        TRUE, FALSE,
+        STARTF_USESTDHANDLES,
+        INVALID_HANDLE_VALUE,
+        DUPLICATE_SAME_ACCESS
+    };
+    use libc::funcs::extra::kernel32::{
+        GetCurrentProcess,
+        DuplicateHandle,
+        CloseHandle,
+        CreateProcessA
+    };
+    use libc::funcs::extra::msvcrt::get_osfhandle;
+
+    use sys;
+
+    unsafe {
+
+        let mut si = zeroed_startupinfo();
+        si.cb = sys::size_of::<STARTUPINFO>() as DWORD;
+        si.dwFlags = STARTF_USESTDHANDLES;
+
+        let cur_proc = GetCurrentProcess();
+
+        let orig_std_in = get_osfhandle(in_fd) as HANDLE;
+        if orig_std_in == INVALID_HANDLE_VALUE as HANDLE {
+            fail!("failure in get_osfhandle: %s", os::last_os_error());
+        }
+        if DuplicateHandle(cur_proc, orig_std_in, cur_proc, &mut si.hStdInput,
+                           0, TRUE, DUPLICATE_SAME_ACCESS) == FALSE {
+            fail!("failure in DuplicateHandle: %s", os::last_os_error());
+        }
+
+        let orig_std_out = get_osfhandle(out_fd) as HANDLE;
+        if orig_std_out == INVALID_HANDLE_VALUE as HANDLE {
+            fail!("failure in get_osfhandle: %s", os::last_os_error());
+        }
+        if DuplicateHandle(cur_proc, orig_std_out, cur_proc, &mut si.hStdOutput,
+                           0, TRUE, DUPLICATE_SAME_ACCESS) == FALSE {
+            fail!("failure in DuplicateHandle: %s", os::last_os_error());
+        }
+
+        let orig_std_err = get_osfhandle(err_fd) as HANDLE;
+        if orig_std_err == INVALID_HANDLE_VALUE as HANDLE {
+            fail!("failure in get_osfhandle: %s", os::last_os_error());
+        }
+        if DuplicateHandle(cur_proc, orig_std_err, cur_proc, &mut si.hStdError,
+                           0, TRUE, DUPLICATE_SAME_ACCESS) == FALSE {
+            fail!("failure in DuplicateHandle: %s", os::last_os_error());
+        }
+
+        let cmd = make_command_line(prog, args);
+        let mut pi = zeroed_process_information();
+        let mut create_err = None;
+
+        do with_envp(env) |envp| {
+            do with_dirp(dir) |dirp| {
+                do cmd.with_c_str |cmdp| {
+                    let created = CreateProcessA(ptr::null(), cast::transmute(cmdp),
+                                                 ptr::mut_null(), ptr::mut_null(), TRUE,
+                                                 0, envp, dirp, &mut si, &mut pi);
+                    if created == FALSE {
+                        create_err = Some(os::last_os_error());
+                    }
+                }
+            }
+        }
+
+        CloseHandle(si.hStdInput);
+        CloseHandle(si.hStdOutput);
+        CloseHandle(si.hStdError);
+
+        for msg in create_err.iter() {
+            fail!("failure in CreateProcess: %s", *msg);
+        }
+
+        // We close the thread handle because we don't care about keeping the thread id valid,
+        // and we aren't keeping the thread handle around to be able to close it later. We don't
+        // close the process handle however because we want the process id to stay valid at least
+        // until the calling code closes the process handle.
+        CloseHandle(pi.hThread);
+
+        SpawnProcessResult {
+            pid: pi.dwProcessId as pid_t,
+            handle: pi.hProcess as *()
+        }
+    }
+}
+
+#[cfg(windows)]
+fn zeroed_startupinfo() -> libc::types::os::arch::extra::STARTUPINFO {
+    libc::types::os::arch::extra::STARTUPINFO {
+        cb: 0,
+        lpReserved: ptr::mut_null(),
+        lpDesktop: ptr::mut_null(),
+        lpTitle: ptr::mut_null(),
+        dwX: 0,
+        dwY: 0,
+        dwXSize: 0,
+        dwYSize: 0,
+        dwXCountChars: 0,
+        dwYCountCharts: 0,
+        dwFillAttribute: 0,
+        dwFlags: 0,
+        wShowWindow: 0,
+        cbReserved2: 0,
+        lpReserved2: ptr::mut_null(),
+        hStdInput: ptr::mut_null(),
+        hStdOutput: ptr::mut_null(),
+        hStdError: ptr::mut_null()
+    }
+}
+
+#[cfg(windows)]
+fn zeroed_process_information() -> libc::types::os::arch::extra::PROCESS_INFORMATION {
+    libc::types::os::arch::extra::PROCESS_INFORMATION {
+        hProcess: ptr::mut_null(),
+        hThread: ptr::mut_null(),
+        dwProcessId: 0,
+        dwThreadId: 0
+    }
+}
+
+// FIXME: this is only pub so it can be tested (see issue #4536)
+#[cfg(windows)]
+pub fn make_command_line(prog: &str, args: &[~str]) -> ~str {
+    let mut cmd = ~"";
+    append_arg(&mut cmd, prog);
+    for arg in args.iter() {
+        cmd.push_char(' ');
+        append_arg(&mut cmd, *arg);
+    }
+    return cmd;
+
+    fn append_arg(cmd: &mut ~str, arg: &str) {
+        let quote = arg.iter().any(|c| c == ' ' || c == '\t');
+        if quote {
+            cmd.push_char('"');
+        }
+        for i in range(0u, arg.len()) {
+            append_char_at(cmd, arg, i);
+        }
+        if quote {
+            cmd.push_char('"');
+        }
+    }
+
+    fn append_char_at(cmd: &mut ~str, arg: &str, i: uint) {
+        match arg[i] as char {
+            '"' => {
+                // Escape quotes.
+                cmd.push_str("\\\"");
+            }
+            '\\' => {
+                if backslash_run_ends_in_quote(arg, i) {
+                    // Double all backslashes that are in runs before quotes.
+                    cmd.push_str("\\\\");
+                } else {
+                    // Pass other backslashes through unescaped.
+                    cmd.push_char('\\');
+                }
+            }
+            c => {
+                cmd.push_char(c);
+            }
+        }
+    }
+
+    fn backslash_run_ends_in_quote(s: &str, mut i: uint) -> bool {
+        while i < s.len() && s[i] as char == '\\' {
+            i += 1;
+        }
+        return i < s.len() && s[i] as char == '"';
+    }
+}
+
+#[cfg(unix)]
+fn spawn_process_os(prog: &str, args: &[~str],
+                    env: Option<~[(~str, ~str)]>,
+                    dir: Option<&Path>,
+                    in_fd: c_int, out_fd: c_int, err_fd: c_int) -> SpawnProcessResult {
+    #[fixed_stack_segment]; #[inline(never)];
+
+    use libc::funcs::posix88::unistd::{fork, dup2, close, chdir, execvp};
+    use libc::funcs::bsd44::getdtablesize;
+
+    mod rustrt {
+        use libc::c_void;
+
+        #[abi = "cdecl"]
+        extern {
+            pub fn rust_unset_sigprocmask();
+            pub fn rust_set_environ(envp: *c_void);
+        }
+    }
+
+    unsafe {
+
+        let pid = fork();
+        if pid < 0 {
+            fail!("failure in fork: %s", os::last_os_error());
+        } else if pid > 0 {
+            return SpawnProcessResult {pid: pid, handle: ptr::null()};
+        }
+
+        rustrt::rust_unset_sigprocmask();
+
+        if dup2(in_fd, 0) == -1 {
+            fail!("failure in dup2(in_fd, 0): %s", os::last_os_error());
+        }
+        if dup2(out_fd, 1) == -1 {
+            fail!("failure in dup2(out_fd, 1): %s", os::last_os_error());
+        }
+        if dup2(err_fd, 2) == -1 {
+            fail!("failure in dup3(err_fd, 2): %s", os::last_os_error());
+        }
+        // close all other fds
+        for fd in range(3, getdtablesize()).invert() {
+            close(fd as c_int);
+        }
+
+        do with_dirp(dir) |dirp| {
+            if !dirp.is_null() && chdir(dirp) == -1 {
+                fail!("failure in chdir: %s", os::last_os_error());
+            }
+        }
+
+        do with_envp(env) |envp| {
+            if !envp.is_null() {
+                rustrt::rust_set_environ(envp);
+            }
+            do with_argv(prog, args) |argv| {
+                execvp(*argv, argv);
+                // execvp only returns if an error occurred
+                fail!("failure in execvp: %s", os::last_os_error());
+            }
+        }
+    }
+}
+
+#[cfg(unix)]
+fn with_argv<T>(prog: &str, args: &[~str], cb: &fn(**libc::c_char) -> T) -> T {
+    use vec;
+
+    // We can't directly convert `str`s into `*char`s, as someone needs to hold
+    // a reference to the intermediary byte buffers. So first build an array to
+    // hold all the ~[u8] byte strings.
+    let mut tmps = vec::with_capacity(args.len() + 1);
+
+    tmps.push(prog.to_c_str());
+
+    for arg in args.iter() {
+        tmps.push(arg.to_c_str());
+    }
+
+    // Next, convert each of the byte strings into a pointer. This is
+    // technically unsafe as the caller could leak these pointers out of our
+    // scope.
+    let mut ptrs = do tmps.map |tmp| {
+        tmp.with_ref(|buf| buf)
+    };
+
+    // Finally, make sure we add a null pointer.
+    ptrs.push(ptr::null());
+
+    ptrs.as_imm_buf(|buf, _| cb(buf))
+}
+
+#[cfg(unix)]
+fn with_envp<T>(env: Option<~[(~str, ~str)]>, cb: &fn(*c_void) -> T) -> T {
+    use vec;
+
+    // On posixy systems we can pass a char** for envp, which is a
+    // null-terminated array of "k=v\n" strings. Like `with_argv`, we have to
+    // have a temporary buffer to hold the intermediary `~[u8]` byte strings.
+    match env {
+        Some(env) => {
+            let mut tmps = vec::with_capacity(env.len());
+
+            for pair in env.iter() {
+                // Use of match here is just to workaround limitations
+                // in the stage0 irrefutable pattern impl.
+                let kv = fmt!("%s=%s", pair.first(), pair.second());
+                tmps.push(kv.to_c_str());
+            }
+
+            // Once again, this is unsafe.
+            let mut ptrs = do tmps.map |tmp| {
+                tmp.with_ref(|buf| buf)
+            };
+            ptrs.push(ptr::null());
+
+            do ptrs.as_imm_buf |buf, _| {
+                unsafe { cb(cast::transmute(buf)) }
+            }
+        }
+        _ => cb(ptr::null())
+    }
+}
+
+#[cfg(windows)]
+fn with_envp<T>(env: Option<~[(~str, ~str)]>, cb: &fn(*mut c_void) -> T) -> T {
+    // On win32 we pass an "environment block" which is not a char**, but
+    // rather a concatenation of null-terminated k=v\0 sequences, with a final
+    // \0 to terminate.
+    match env {
+        Some(env) => {
+            let mut blk = ~[];
+
+            for pair in env.iter() {
+                let kv = fmt!("%s=%s", pair.first(), pair.second());
+                blk.push_all(kv.as_bytes());
+                blk.push(0);
+            }
+
+            blk.push(0);
+
+            do blk.as_imm_buf |p, _len| {
+                unsafe { cb(cast::transmute(p)) }
+            }
+        }
+        _ => cb(ptr::mut_null())
+    }
+}
+
+fn with_dirp<T>(d: Option<&Path>, cb: &fn(*libc::c_char) -> T) -> T {
+    match d {
+      Some(dir) => dir.with_c_str(|buf| cb(buf)),
+      None => cb(ptr::null())
+    }
+}
+
+#[cfg(windows)]
+fn free_handle(handle: *()) {
+    #[fixed_stack_segment]; #[inline(never)];
+    unsafe {
+        libc::funcs::extra::kernel32::CloseHandle(cast::transmute(handle));
     }
 }
 
+#[cfg(unix)]
+fn free_handle(_handle: *()) {
+    // unix has no process handle object, just a pid
+}
+
 /**
  * Spawns a process and waits for it to terminate. The process will
  * inherit the current stdin/stdout/stderr file descriptors.
@@ -369,7 +824,7 @@ pub fn process_status(prog: &str, args: &[~str]) -> int {
         in_fd: Some(0),
         out_fd: Some(1),
         err_fd: Some(2)
-    }).unwrap();
+    });
     prog.finish()
 }
 
@@ -386,38 +841,162 @@ pub fn process_status(prog: &str, args: &[~str]) -> int {
  * The process's stdout/stderr output and exit code.
  */
 pub fn process_output(prog: &str, args: &[~str]) -> ProcessOutput {
-    let mut prog = Process::new(prog, args, ProcessOptions::new()).unwrap();
+    let mut prog = Process::new(prog, args, ProcessOptions::new());
     prog.finish_with_output()
 }
 
+/**
+ * Waits for a process to exit and returns the exit code, failing
+ * if there is no process with the specified id.
+ *
+ * Note that this is private to avoid race conditions on unix where if
+ * a user calls waitpid(some_process.get_id()) then some_process.finish()
+ * and some_process.destroy() and some_process.finalize() will then either
+ * operate on a none-existent process or, even worse, on a newer process
+ * with the same id.
+ */
+fn waitpid(pid: pid_t) -> int {
+    return waitpid_os(pid);
+
+    #[cfg(windows)]
+    fn waitpid_os(pid: pid_t) -> int {
+        #[fixed_stack_segment]; #[inline(never)];
+
+        use libc::types::os::arch::extra::DWORD;
+        use libc::consts::os::extra::{
+            SYNCHRONIZE,
+            PROCESS_QUERY_INFORMATION,
+            FALSE,
+            STILL_ACTIVE,
+            INFINITE,
+            WAIT_FAILED
+        };
+        use libc::funcs::extra::kernel32::{
+            OpenProcess,
+            GetExitCodeProcess,
+            CloseHandle,
+            WaitForSingleObject
+        };
+
+        unsafe {
+
+            let proc = OpenProcess(SYNCHRONIZE | PROCESS_QUERY_INFORMATION, FALSE, pid as DWORD);
+            if proc.is_null() {
+                fail!("failure in OpenProcess: %s", os::last_os_error());
+            }
+
+            loop {
+                let mut status = 0;
+                if GetExitCodeProcess(proc, &mut status) == FALSE {
+                    CloseHandle(proc);
+                    fail!("failure in GetExitCodeProcess: %s", os::last_os_error());
+                }
+                if status != STILL_ACTIVE {
+                    CloseHandle(proc);
+                    return status as int;
+                }
+                if WaitForSingleObject(proc, INFINITE) == WAIT_FAILED {
+                    CloseHandle(proc);
+                    fail!("failure in WaitForSingleObject: %s", os::last_os_error());
+                }
+            }
+        }
+    }
+
+    #[cfg(unix)]
+    fn waitpid_os(pid: pid_t) -> int {
+        #[fixed_stack_segment]; #[inline(never)];
+
+        use libc::funcs::posix01::wait::*;
+
+        #[cfg(target_os = "linux")]
+        #[cfg(target_os = "android")]
+        fn WIFEXITED(status: i32) -> bool {
+            (status & 0xffi32) == 0i32
+        }
+
+        #[cfg(target_os = "macos")]
+        #[cfg(target_os = "freebsd")]
+        fn WIFEXITED(status: i32) -> bool {
+            (status & 0x7fi32) == 0i32
+        }
+
+        #[cfg(target_os = "linux")]
+        #[cfg(target_os = "android")]
+        fn WEXITSTATUS(status: i32) -> i32 {
+            (status >> 8i32) & 0xffi32
+        }
+
+        #[cfg(target_os = "macos")]
+        #[cfg(target_os = "freebsd")]
+        fn WEXITSTATUS(status: i32) -> i32 {
+            status >> 8i32
+        }
+
+        let mut status = 0 as c_int;
+        if unsafe { waitpid(pid, &mut status, 0) } == -1 {
+            fail!("failure in waitpid: %s", os::last_os_error());
+        }
+
+        return if WIFEXITED(status) {
+            WEXITSTATUS(status) as int
+        } else {
+            1
+        };
+    }
+}
+
 #[cfg(test)]
 mod tests {
+    use io;
+    use libc::c_int;
+    use option::{Option, None, Some};
     use os;
     use path::Path;
-    use prelude::*;
+    use run;
     use str;
-    use super::*;
     use unstable::running_on_valgrind;
 
+    #[test]
+    #[cfg(windows)]
+    fn test_make_command_line() {
+        assert_eq!(
+            run::make_command_line("prog", [~"aaa", ~"bbb", ~"ccc"]),
+            ~"prog aaa bbb ccc"
+        );
+        assert_eq!(
+            run::make_command_line("C:\\Program Files\\blah\\blah.exe", [~"aaa"]),
+            ~"\"C:\\Program Files\\blah\\blah.exe\" aaa"
+        );
+        assert_eq!(
+            run::make_command_line("C:\\Program Files\\test", [~"aa\"bb"]),
+            ~"\"C:\\Program Files\\test\" aa\\\"bb"
+        );
+        assert_eq!(
+            run::make_command_line("echo", [~"a b c"]),
+            ~"echo \"a b c\""
+        );
+    }
+
     #[test]
     #[cfg(not(target_os="android"))]
     fn test_process_status() {
-        assert_eq!(process_status("false", []), 1);
-        assert_eq!(process_status("true", []), 0);
+        assert_eq!(run::process_status("false", []), 1);
+        assert_eq!(run::process_status("true", []), 0);
     }
     #[test]
     #[cfg(target_os="android")]
     fn test_process_status() {
-        assert_eq!(process_status("/system/bin/sh", [~"-c",~"false"]), 1);
-        assert_eq!(process_status("/system/bin/sh", [~"-c",~"true"]), 0);
+        assert_eq!(run::process_status("/system/bin/sh", [~"-c",~"false"]), 1);
+        assert_eq!(run::process_status("/system/bin/sh", [~"-c",~"true"]), 0);
     }
 
     #[test]
     #[cfg(not(target_os="android"))]
     fn test_process_output_output() {
 
-        let ProcessOutput {status, output, error}
-             = process_output("echo", [~"hello"]);
+        let run::ProcessOutput {status, output, error}
+             = run::process_output("echo", [~"hello"]);
         let output_str = str::from_bytes(output);
 
         assert_eq!(status, 0);
@@ -431,8 +1010,8 @@ fn test_process_output_output() {
     #[cfg(target_os="android")]
     fn test_process_output_output() {
 
-        let ProcessOutput {status, output, error}
-             = process_output("/system/bin/sh", [~"-c",~"echo hello"]);
+        let run::ProcessOutput {status, output, error}
+             = run::process_output("/system/bin/sh", [~"-c",~"echo hello"]);
         let output_str = str::from_bytes(output);
 
         assert_eq!(status, 0);
@@ -447,8 +1026,8 @@ fn test_process_output_output() {
     #[cfg(not(target_os="android"))]
     fn test_process_output_error() {
 
-        let ProcessOutput {status, output, error}
-             = process_output("mkdir", [~"."]);
+        let run::ProcessOutput {status, output, error}
+             = run::process_output("mkdir", [~"."]);
 
         assert_eq!(status, 1);
         assert_eq!(output, ~[]);
@@ -458,40 +1037,90 @@ fn test_process_output_error() {
     #[cfg(target_os="android")]
     fn test_process_output_error() {
 
-        let ProcessOutput {status, output, error}
-             = process_output("/system/bin/mkdir", [~"."]);
+        let run::ProcessOutput {status, output, error}
+             = run::process_output("/system/bin/mkdir", [~"."]);
 
         assert_eq!(status, 255);
         assert_eq!(output, ~[]);
         assert!(!error.is_empty());
     }
 
+    #[test]
+    fn test_pipes() {
+
+        let pipe_in = os::pipe();
+        let pipe_out = os::pipe();
+        let pipe_err = os::pipe();
+
+        let mut proc = run::Process::new("cat", [], run::ProcessOptions {
+            dir: None,
+            env: None,
+            in_fd: Some(pipe_in.input),
+            out_fd: Some(pipe_out.out),
+            err_fd: Some(pipe_err.out)
+        });
+
+        assert!(proc.input_redirected());
+        assert!(proc.output_redirected());
+        assert!(proc.error_redirected());
+
+        os::close(pipe_in.input);
+        os::close(pipe_out.out);
+        os::close(pipe_err.out);
+
+        let expected = ~"test";
+        writeclose(pipe_in.out, expected);
+        let actual = readclose(pipe_out.input);
+        readclose(pipe_err.input);
+        proc.finish();
+
+        assert_eq!(expected, actual);
+    }
+
+    fn writeclose(fd: c_int, s: &str) {
+        let writer = io::fd_writer(fd, false);
+        writer.write_str(s);
+        os::close(fd);
+    }
+
+    fn readclose(fd: c_int) -> ~str {
+        #[fixed_stack_segment]; #[inline(never)];
+
+        unsafe {
+            let file = os::fdopen(fd);
+            let reader = io::FILE_reader(file, false);
+            let buf = reader.read_whole_stream();
+            os::fclose(file);
+            str::from_bytes(buf)
+        }
+    }
+
     #[test]
     #[cfg(not(target_os="android"))]
     fn test_finish_once() {
-        let mut prog = Process::new("false", [], ProcessOptions::new()).unwrap();
+        let mut prog = run::Process::new("false", [], run::ProcessOptions::new());
         assert_eq!(prog.finish(), 1);
     }
     #[test]
     #[cfg(target_os="android")]
     fn test_finish_once() {
-        let mut prog = Process::new("/system/bin/sh", [~"-c",~"false"],
-                                    ProcessOptions::new()).unwrap();
+        let mut prog = run::Process::new("/system/bin/sh", [~"-c",~"false"],
+                                         run::ProcessOptions::new());
         assert_eq!(prog.finish(), 1);
     }
 
     #[test]
     #[cfg(not(target_os="android"))]
     fn test_finish_twice() {
-        let mut prog = Process::new("false", [], ProcessOptions::new()).unwrap();
+        let mut prog = run::Process::new("false", [], run::ProcessOptions::new());
         assert_eq!(prog.finish(), 1);
         assert_eq!(prog.finish(), 1);
     }
     #[test]
     #[cfg(target_os="android")]
     fn test_finish_twice() {
-        let mut prog = Process::new("/system/bin/sh", [~"-c",~"false"],
-                                    ProcessOptions::new()).unwrap();
+        let mut prog = run::Process::new("/system/bin/sh", [~"-c",~"false"],
+                                         run::ProcessOptions::new());
         assert_eq!(prog.finish(), 1);
         assert_eq!(prog.finish(), 1);
     }
@@ -500,9 +1129,8 @@ fn test_finish_twice() {
     #[cfg(not(target_os="android"))]
     fn test_finish_with_output_once() {
 
-        let prog = Process::new("echo", [~"hello"], ProcessOptions::new());
-        let mut prog = prog.unwrap();
-        let ProcessOutput {status, output, error}
+        let mut prog = run::Process::new("echo", [~"hello"], run::ProcessOptions::new());
+        let run::ProcessOutput {status, output, error}
             = prog.finish_with_output();
         let output_str = str::from_bytes(output);
 
@@ -517,10 +1145,28 @@ fn test_finish_with_output_once() {
     #[cfg(target_os="android")]
     fn test_finish_with_output_once() {
 
-        let mut prog = Process::new("/system/bin/sh", [~"-c",~"echo hello"],
-                                    ProcessOptions::new()).unwrap();
-        let ProcessOutput {status, output, error}
+        let mut prog = run::Process::new("/system/bin/sh", [~"-c",~"echo hello"],
+                                         run::ProcessOptions::new());
+        let run::ProcessOutput {status, output, error}
+            = prog.finish_with_output();
+        let output_str = str::from_bytes(output);
+
+        assert_eq!(status, 0);
+        assert_eq!(output_str.trim().to_owned(), ~"hello");
+        // FIXME #7224
+        if !running_on_valgrind() {
+            assert_eq!(error, ~[]);
+        }
+    }
+
+    #[test]
+    #[cfg(not(target_os="android"))]
+    fn test_finish_with_output_twice() {
+
+        let mut prog = run::Process::new("echo", [~"hello"], run::ProcessOptions::new());
+        let run::ProcessOutput {status, output, error}
             = prog.finish_with_output();
+
         let output_str = str::from_bytes(output);
 
         assert_eq!(status, 0);
@@ -529,61 +1175,97 @@ fn test_finish_with_output_once() {
         if !running_on_valgrind() {
             assert_eq!(error, ~[]);
         }
+
+        let run::ProcessOutput {status, output, error}
+            = prog.finish_with_output();
+
+        assert_eq!(status, 0);
+        assert_eq!(output, ~[]);
+        // FIXME #7224
+        if !running_on_valgrind() {
+            assert_eq!(error, ~[]);
+        }
+    }
+    #[test]
+    #[cfg(target_os="android")]
+    fn test_finish_with_output_twice() {
+
+        let mut prog = run::Process::new("/system/bin/sh", [~"-c",~"echo hello"],
+                                         run::ProcessOptions::new());
+        let run::ProcessOutput {status, output, error}
+            = prog.finish_with_output();
+
+        let output_str = str::from_bytes(output);
+
+        assert_eq!(status, 0);
+        assert_eq!(output_str.trim().to_owned(), ~"hello");
+        // FIXME #7224
+        if !running_on_valgrind() {
+            assert_eq!(error, ~[]);
+        }
+
+        let run::ProcessOutput {status, output, error}
+            = prog.finish_with_output();
+
+        assert_eq!(status, 0);
+        assert_eq!(output, ~[]);
+        // FIXME #7224
+        if !running_on_valgrind() {
+            assert_eq!(error, ~[]);
+        }
     }
 
     #[test]
     #[should_fail]
     #[cfg(not(windows),not(target_os="android"))]
     fn test_finish_with_output_redirected() {
-        let mut prog = Process::new("echo", [~"hello"], ProcessOptions {
+        let mut prog = run::Process::new("echo", [~"hello"], run::ProcessOptions {
             env: None,
             dir: None,
             in_fd: Some(0),
             out_fd: Some(1),
             err_fd: Some(2)
-        }).unwrap();
-        // this should fail because it is not valid to read the output when it
-        // was redirected
+        });
+        // this should fail because it is not valid to read the output when it was redirected
         prog.finish_with_output();
     }
     #[test]
     #[should_fail]
     #[cfg(not(windows),target_os="android")]
     fn test_finish_with_output_redirected() {
-        let mut prog = Process::new("/system/bin/sh", [~"-c",~"echo hello"],
-                                    ProcessOptions {
+        let mut prog = run::Process::new("/system/bin/sh", [~"-c",~"echo hello"],
+                                         run::ProcessOptions {
             env: None,
             dir: None,
             in_fd: Some(0),
             out_fd: Some(1),
             err_fd: Some(2)
-        }).unwrap();
-        // this should fail because it is not valid to read the output when it
-        // was redirected
+        });
+        // this should fail because it is not valid to read the output when it was redirected
         prog.finish_with_output();
     }
 
     #[cfg(unix,not(target_os="android"))]
-    fn run_pwd(dir: Option<&Path>) -> Process {
-        Process::new("pwd", [], ProcessOptions {
+    fn run_pwd(dir: Option<&Path>) -> run::Process {
+        run::Process::new("pwd", [], run::ProcessOptions {
             dir: dir,
-            .. ProcessOptions::new()
-        }).unwrap()
+            .. run::ProcessOptions::new()
+        })
     }
     #[cfg(unix,target_os="android")]
-    fn run_pwd(dir: Option<&Path>) -> Process {
-        Process::new("/system/bin/sh", [~"-c",~"pwd"], ProcessOptions {
+    fn run_pwd(dir: Option<&Path>) -> run::Process {
+        run::Process::new("/system/bin/sh", [~"-c",~"pwd"], run::ProcessOptions {
             dir: dir,
-            .. ProcessOptions::new()
-        }).unwrap()
+            .. run::ProcessOptions::new()
+        })
     }
 
     #[cfg(windows)]
-    fn run_pwd(dir: Option<&Path>) -> Process {
-        Process::new("cmd", [~"/c", ~"cd"], ProcessOptions {
+    fn run_pwd(dir: Option<&Path>) -> run::Process {
+        run::Process::new("cmd", [~"/c", ~"cd"], run::ProcessOptions {
             dir: dir,
-            .. ProcessOptions::new()
-        }).unwrap()
+            .. run::ProcessOptions::new()
+        })
     }
 
     #[test]
@@ -619,26 +1301,26 @@ fn test_change_working_directory() {
     }
 
     #[cfg(unix,not(target_os="android"))]
-    fn run_env(env: Option<~[(~str, ~str)]>) -> Process {
-        Process::new("env", [], ProcessOptions {
+    fn run_env(env: Option<~[(~str, ~str)]>) -> run::Process {
+        run::Process::new("env", [], run::ProcessOptions {
             env: env,
-            .. ProcessOptions::new()
-        }).unwrap()
+            .. run::ProcessOptions::new()
+        })
     }
     #[cfg(unix,target_os="android")]
-    fn run_env(env: Option<~[(~str, ~str)]>) -> Process {
-        Process::new("/system/bin/sh", [~"-c",~"set"], ProcessOptions {
+    fn run_env(env: Option<~[(~str, ~str)]>) -> run::Process {
+        run::Process::new("/system/bin/sh", [~"-c",~"set"], run::ProcessOptions {
             env: env,
-            .. ProcessOptions::new()
-        }).unwrap()
+            .. run::ProcessOptions::new()
+        })
     }
 
     #[cfg(windows)]
-    fn run_env(env: Option<~[(~str, ~str)]>) -> Process {
-        Process::new("cmd", [~"/c", ~"set"], ProcessOptions {
+    fn run_env(env: Option<~[(~str, ~str)]>) -> run::Process {
+        run::Process::new("cmd", [~"/c", ~"set"], run::ProcessOptions {
             env: env,
-            .. ProcessOptions::new()
-        }).unwrap()
+            .. run::ProcessOptions::new()
+        })
     }
 
     #[test]
@@ -675,6 +1357,7 @@ fn test_inherit_env() {
 
     #[test]
     fn test_add_to_env() {
+
         let mut new_env = os::env();
         new_env.push((~"RUN_TEST_NEW_ENV", ~"123"));