{-# LANGUAGE CPP, Rank2Types #-}
{-# OPTIONS_GHC -fno-warn-tabs #-}
module Utility.Process (
module X,
CreateProcess(..),
StdHandle(..),
readProcess,
readProcess',
readProcessEnv,
writeReadProcessEnv,
forceSuccessProcess,
forceSuccessProcess',
checkSuccessProcess,
ignoreFailureProcess,
createProcessSuccess,
createProcessChecked,
createBackgroundProcess,
withHandle,
withIOHandles,
withOEHandles,
withNullHandle,
withQuietOutput,
feedWithQuietOutput,
createProcess,
waitForProcess,
startInteractiveProcess,
stdinHandle,
stdoutHandle,
stderrHandle,
ioHandles,
processHandle,
devNull,
) where
import qualified Utility.Process.Shim
import qualified Utility.Process.Shim as X hiding (CreateProcess(..), createProcess, runInteractiveProcess, readProcess, readProcessWithExitCode, system, rawSystem, runInteractiveCommand, runProcess)
import Utility.Process.Shim hiding (createProcess, readProcess, waitForProcess)
import Utility.Misc
import Utility.Exception
import System.Exit
import System.IO
import System.Log.Logger
import Control.Concurrent
import qualified Control.Exception as E
import Control.Monad
type CreateProcessRunner = forall a. CreateProcess -> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO a) -> IO a
data StdHandle = StdinHandle | StdoutHandle | StderrHandle
deriving (StdHandle -> StdHandle -> Bool
(StdHandle -> StdHandle -> Bool)
-> (StdHandle -> StdHandle -> Bool) -> Eq StdHandle
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: StdHandle -> StdHandle -> Bool
$c/= :: StdHandle -> StdHandle -> Bool
== :: StdHandle -> StdHandle -> Bool
$c== :: StdHandle -> StdHandle -> Bool
Eq)
readProcess :: FilePath -> [String] -> IO String
readProcess :: FilePath -> [FilePath] -> IO FilePath
readProcess cmd :: FilePath
cmd args :: [FilePath]
args = FilePath
-> [FilePath] -> Maybe [(FilePath, FilePath)] -> IO FilePath
readProcessEnv FilePath
cmd [FilePath]
args Maybe [(FilePath, FilePath)]
forall a. Maybe a
Nothing
readProcessEnv :: FilePath -> [String] -> Maybe [(String, String)] -> IO String
readProcessEnv :: FilePath
-> [FilePath] -> Maybe [(FilePath, FilePath)] -> IO FilePath
readProcessEnv cmd :: FilePath
cmd args :: [FilePath]
args environ :: Maybe [(FilePath, FilePath)]
environ = CreateProcess -> IO FilePath
readProcess' CreateProcess
p
where
p :: CreateProcess
p = (FilePath -> [FilePath] -> CreateProcess
proc FilePath
cmd [FilePath]
args)
{ std_out :: StdStream
std_out = StdStream
CreatePipe
, env :: Maybe [(FilePath, FilePath)]
env = Maybe [(FilePath, FilePath)]
environ
}
readProcess' :: CreateProcess -> IO String
readProcess' :: CreateProcess -> IO FilePath
readProcess' p :: CreateProcess
p = StdHandle
-> CreateProcessRunner
-> CreateProcess
-> (Handle -> IO FilePath)
-> IO FilePath
forall a.
StdHandle
-> CreateProcessRunner -> CreateProcess -> (Handle -> IO a) -> IO a
withHandle StdHandle
StdoutHandle CreateProcessRunner
createProcessSuccess CreateProcess
p ((Handle -> IO FilePath) -> IO FilePath)
-> (Handle -> IO FilePath) -> IO FilePath
forall a b. (a -> b) -> a -> b
$ \h :: Handle
h -> do
FilePath
output <- Handle -> IO FilePath
hGetContentsStrict Handle
h
Handle -> IO ()
hClose Handle
h
FilePath -> IO FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
output
writeReadProcessEnv
:: FilePath
-> [String]
-> Maybe [(String, String)]
-> (Maybe (Handle -> IO ()))
-> (Maybe (Handle -> IO ()))
-> IO String
writeReadProcessEnv :: FilePath
-> [FilePath]
-> Maybe [(FilePath, FilePath)]
-> Maybe (Handle -> IO ())
-> Maybe (Handle -> IO ())
-> IO FilePath
writeReadProcessEnv cmd :: FilePath
cmd args :: [FilePath]
args environ :: Maybe [(FilePath, FilePath)]
environ writestdin :: Maybe (Handle -> IO ())
writestdin adjusthandle :: Maybe (Handle -> IO ())
adjusthandle = do
(Just inh :: Handle
inh, Just outh :: Handle
outh, _, pid :: ProcessHandle
pid) <- CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
createProcess CreateProcess
p
IO ()
-> ((Handle -> IO ()) -> IO ()) -> Maybe (Handle -> IO ()) -> IO ()
forall b a. b -> (a -> b) -> Maybe a -> b
maybe (() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()) (\a :: Handle -> IO ()
a -> Handle -> IO ()
a Handle
inh) Maybe (Handle -> IO ())
adjusthandle
IO ()
-> ((Handle -> IO ()) -> IO ()) -> Maybe (Handle -> IO ()) -> IO ()
forall b a. b -> (a -> b) -> Maybe a -> b
maybe (() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()) (\a :: Handle -> IO ()
a -> Handle -> IO ()
a Handle
outh) Maybe (Handle -> IO ())
adjusthandle
FilePath
output <- Handle -> IO FilePath
hGetContents Handle
outh
MVar ()
outMVar <- IO (MVar ())
forall a. IO (MVar a)
newEmptyMVar
ThreadId
_ <- IO () -> IO ThreadId
forkIO (IO () -> IO ThreadId) -> IO () -> IO ThreadId
forall a b. (a -> b) -> a -> b
$ Int -> IO Int
forall a. a -> IO a
E.evaluate (FilePath -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length FilePath
output) IO Int -> IO () -> IO ()
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> MVar () -> () -> IO ()
forall a. MVar a -> a -> IO ()
putMVar MVar ()
outMVar ()
IO ()
-> ((Handle -> IO ()) -> IO ()) -> Maybe (Handle -> IO ()) -> IO ()
forall b a. b -> (a -> b) -> Maybe a -> b
maybe (() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()) (\a :: Handle -> IO ()
a -> Handle -> IO ()
a Handle
inh IO () -> IO () -> IO ()
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Handle -> IO ()
hFlush Handle
inh) Maybe (Handle -> IO ())
writestdin
Handle -> IO ()
hClose Handle
inh
MVar () -> IO ()
forall a. MVar a -> IO a
takeMVar MVar ()
outMVar
Handle -> IO ()
hClose Handle
outh
CreateProcess -> ProcessHandle -> IO ()
forceSuccessProcess CreateProcess
p ProcessHandle
pid
FilePath -> IO FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
output
where
p :: CreateProcess
p = (FilePath -> [FilePath] -> CreateProcess
proc FilePath
cmd [FilePath]
args)
{ std_in :: StdStream
std_in = StdStream
CreatePipe
, std_out :: StdStream
std_out = StdStream
CreatePipe
, std_err :: StdStream
std_err = StdStream
Inherit
, env :: Maybe [(FilePath, FilePath)]
env = Maybe [(FilePath, FilePath)]
environ
}
forceSuccessProcess :: CreateProcess -> ProcessHandle -> IO ()
forceSuccessProcess :: CreateProcess -> ProcessHandle -> IO ()
forceSuccessProcess p :: CreateProcess
p pid :: ProcessHandle
pid = ProcessHandle -> IO ExitCode
waitForProcess ProcessHandle
pid IO ExitCode -> (ExitCode -> IO ()) -> IO ()
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= CreateProcess -> ExitCode -> IO ()
forceSuccessProcess' CreateProcess
p
forceSuccessProcess' :: CreateProcess -> ExitCode -> IO ()
forceSuccessProcess' :: CreateProcess -> ExitCode -> IO ()
forceSuccessProcess' _ ExitSuccess = () -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
forceSuccessProcess' p :: CreateProcess
p (ExitFailure n :: Int
n) = FilePath -> IO ()
forall (m :: * -> *) a. MonadFail m => FilePath -> m a
fail (FilePath -> IO ()) -> FilePath -> IO ()
forall a b. (a -> b) -> a -> b
$
CreateProcess -> FilePath
showCmd CreateProcess
p FilePath -> FilePath -> FilePath
forall a. [a] -> [a] -> [a]
++ " exited " FilePath -> FilePath -> FilePath
forall a. [a] -> [a] -> [a]
++ Int -> FilePath
forall a. Show a => a -> FilePath
show Int
n
checkSuccessProcess :: ProcessHandle -> IO Bool
checkSuccessProcess :: ProcessHandle -> IO Bool
checkSuccessProcess pid :: ProcessHandle
pid = do
ExitCode
code <- ProcessHandle -> IO ExitCode
waitForProcess ProcessHandle
pid
Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return (Bool -> IO Bool) -> Bool -> IO Bool
forall a b. (a -> b) -> a -> b
$ ExitCode
code ExitCode -> ExitCode -> Bool
forall a. Eq a => a -> a -> Bool
== ExitCode
ExitSuccess
ignoreFailureProcess :: ProcessHandle -> IO Bool
ignoreFailureProcess :: ProcessHandle -> IO Bool
ignoreFailureProcess pid :: ProcessHandle
pid = do
IO ExitCode -> IO ()
forall (f :: * -> *) a. Functor f => f a -> f ()
void (IO ExitCode -> IO ()) -> IO ExitCode -> IO ()
forall a b. (a -> b) -> a -> b
$ ProcessHandle -> IO ExitCode
waitForProcess ProcessHandle
pid
Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True
createProcessSuccess :: CreateProcessRunner
createProcessSuccess :: CreateProcess
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
createProcessSuccess p :: CreateProcess
p a :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO a
a = (ProcessHandle -> IO ())
-> CreateProcess
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
forall b. (ProcessHandle -> IO b) -> CreateProcessRunner
createProcessChecked (CreateProcess -> ProcessHandle -> IO ()
forceSuccessProcess CreateProcess
p) CreateProcess
p (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO a
a
createProcessChecked :: (ProcessHandle -> IO b) -> CreateProcessRunner
createProcessChecked :: (ProcessHandle -> IO b) -> CreateProcessRunner
createProcessChecked checker :: ProcessHandle -> IO b
checker p :: CreateProcess
p a :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO a
a = do
t :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
t@(_, _, _, pid :: ProcessHandle
pid) <- CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
createProcess CreateProcess
p
Either SomeException a
r <- IO a -> IO (Either SomeException a)
forall (m :: * -> *) a.
MonadCatch m =>
m a -> m (Either SomeException a)
tryNonAsync (IO a -> IO (Either SomeException a))
-> IO a -> IO (Either SomeException a)
forall a b. (a -> b) -> a -> b
$ (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO a
a (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
t
b
_ <- ProcessHandle -> IO b
checker ProcessHandle
pid
(SomeException -> IO a)
-> (a -> IO a) -> Either SomeException a -> IO a
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either SomeException -> IO a
forall a e. Exception e => e -> a
E.throw a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Either SomeException a
r
createBackgroundProcess :: CreateProcessRunner
createBackgroundProcess :: CreateProcess
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
createBackgroundProcess p :: CreateProcess
p a :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO a
a = (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO a
a ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO a)
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a
forall (m :: * -> *) a b. Monad m => (a -> m b) -> m a -> m b
=<< CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
createProcess CreateProcess
p
withHandle
:: StdHandle
-> CreateProcessRunner
-> CreateProcess
-> (Handle -> IO a)
-> IO a
withHandle :: StdHandle
-> CreateProcessRunner -> CreateProcess -> (Handle -> IO a) -> IO a
withHandle h :: StdHandle
h creator :: CreateProcessRunner
creator p :: CreateProcess
p a :: Handle -> IO a
a = CreateProcess
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
CreateProcessRunner
creator CreateProcess
p' (((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a)
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
forall a b. (a -> b) -> a -> b
$ Handle -> IO a
a (Handle -> IO a)
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> Handle)
-> (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
select
where
base :: CreateProcess
base = CreateProcess
p
{ std_in :: StdStream
std_in = StdStream
Inherit
, std_out :: StdStream
std_out = StdStream
Inherit
, std_err :: StdStream
std_err = StdStream
Inherit
}
(select :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
select, p' :: CreateProcess
p') = case StdHandle
h of
StdinHandle -> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
stdinHandle, CreateProcess
base { std_in :: StdStream
std_in = StdStream
CreatePipe })
StdoutHandle -> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
stdoutHandle, CreateProcess
base { std_out :: StdStream
std_out = StdStream
CreatePipe })
StderrHandle -> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
stderrHandle, CreateProcess
base { std_err :: StdStream
std_err = StdStream
CreatePipe })
withIOHandles
:: CreateProcessRunner
-> CreateProcess
-> ((Handle, Handle) -> IO a)
-> IO a
withIOHandles :: CreateProcessRunner
-> CreateProcess -> ((Handle, Handle) -> IO a) -> IO a
withIOHandles creator :: CreateProcessRunner
creator p :: CreateProcess
p a :: (Handle, Handle) -> IO a
a = CreateProcess
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
CreateProcessRunner
creator CreateProcess
p' (((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a)
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
forall a b. (a -> b) -> a -> b
$ (Handle, Handle) -> IO a
a ((Handle, Handle) -> IO a)
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> (Handle, Handle))
-> (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> (Handle, Handle)
ioHandles
where
p' :: CreateProcess
p' = CreateProcess
p
{ std_in :: StdStream
std_in = StdStream
CreatePipe
, std_out :: StdStream
std_out = StdStream
CreatePipe
, std_err :: StdStream
std_err = StdStream
Inherit
}
withOEHandles
:: CreateProcessRunner
-> CreateProcess
-> ((Handle, Handle) -> IO a)
-> IO a
withOEHandles :: CreateProcessRunner
-> CreateProcess -> ((Handle, Handle) -> IO a) -> IO a
withOEHandles creator :: CreateProcessRunner
creator p :: CreateProcess
p a :: (Handle, Handle) -> IO a
a = CreateProcess
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
CreateProcessRunner
creator CreateProcess
p' (((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a)
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
forall a b. (a -> b) -> a -> b
$ (Handle, Handle) -> IO a
a ((Handle, Handle) -> IO a)
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> (Handle, Handle))
-> (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> (Handle, Handle)
oeHandles
where
p' :: CreateProcess
p' = CreateProcess
p
{ std_in :: StdStream
std_in = StdStream
Inherit
, std_out :: StdStream
std_out = StdStream
CreatePipe
, std_err :: StdStream
std_err = StdStream
CreatePipe
}
withNullHandle :: (Handle -> IO a) -> IO a
withNullHandle :: (Handle -> IO a) -> IO a
withNullHandle = FilePath -> IOMode -> (Handle -> IO a) -> IO a
forall r. FilePath -> IOMode -> (Handle -> IO r) -> IO r
withFile FilePath
devNull IOMode
WriteMode
withQuietOutput
:: CreateProcessRunner
-> CreateProcess
-> IO ()
withQuietOutput :: CreateProcessRunner -> CreateProcess -> IO ()
withQuietOutput creator :: CreateProcessRunner
creator p :: CreateProcess
p = (Handle -> IO ()) -> IO ()
forall a. (Handle -> IO a) -> IO a
withNullHandle ((Handle -> IO ()) -> IO ()) -> (Handle -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \nullh :: Handle
nullh -> do
let p' :: CreateProcess
p' = CreateProcess
p
{ std_out :: StdStream
std_out = Handle -> StdStream
UseHandle Handle
nullh
, std_err :: StdStream
std_err = Handle -> StdStream
UseHandle Handle
nullh
}
CreateProcess
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO ())
-> IO ()
CreateProcessRunner
creator CreateProcess
p' (((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO ())
-> IO ())
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO ())
-> IO ()
forall a b. (a -> b) -> a -> b
$ IO ()
-> (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO ()
forall a b. a -> b -> a
const (IO ()
-> (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO ())
-> IO ()
-> (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO ()
forall a b. (a -> b) -> a -> b
$ () -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
feedWithQuietOutput
:: CreateProcessRunner
-> CreateProcess
-> (Handle -> IO a)
-> IO a
feedWithQuietOutput :: CreateProcessRunner -> CreateProcess -> (Handle -> IO a) -> IO a
feedWithQuietOutput creator :: CreateProcessRunner
creator p :: CreateProcess
p a :: Handle -> IO a
a = FilePath -> IOMode -> (Handle -> IO a) -> IO a
forall r. FilePath -> IOMode -> (Handle -> IO r) -> IO r
withFile FilePath
devNull IOMode
WriteMode ((Handle -> IO a) -> IO a) -> (Handle -> IO a) -> IO a
forall a b. (a -> b) -> a -> b
$ \nullh :: Handle
nullh -> do
let p' :: CreateProcess
p' = CreateProcess
p
{ std_in :: StdStream
std_in = StdStream
CreatePipe
, std_out :: StdStream
std_out = Handle -> StdStream
UseHandle Handle
nullh
, std_err :: StdStream
std_err = Handle -> StdStream
UseHandle Handle
nullh
}
CreateProcess
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
CreateProcessRunner
creator CreateProcess
p' (((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a)
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a)
-> IO a
forall a b. (a -> b) -> a -> b
$ Handle -> IO a
a (Handle -> IO a)
-> ((Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> Handle)
-> (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
stdinHandle
devNull :: FilePath
#ifndef mingw32_HOST_OS
devNull :: FilePath
devNull = "/dev/null"
#else
devNull = "\\\\.\\NUL"
#endif
type HandleExtractor = (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
stdinHandle :: HandleExtractor
stdinHandle :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
stdinHandle (Just h :: Handle
h, _, _, _) = Handle
h
stdinHandle _ = FilePath -> Handle
forall a. HasCallStack => FilePath -> a
error "expected stdinHandle"
stdoutHandle :: HandleExtractor
stdoutHandle :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
stdoutHandle (_, Just h :: Handle
h, _, _) = Handle
h
stdoutHandle _ = FilePath -> Handle
forall a. HasCallStack => FilePath -> a
error "expected stdoutHandle"
stderrHandle :: HandleExtractor
stderrHandle :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> Handle
stderrHandle (_, _, Just h :: Handle
h, _) = Handle
h
stderrHandle _ = FilePath -> Handle
forall a. HasCallStack => FilePath -> a
error "expected stderrHandle"
ioHandles :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> (Handle, Handle)
ioHandles :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> (Handle, Handle)
ioHandles (Just hin :: Handle
hin, Just hout :: Handle
hout, _, _) = (Handle
hin, Handle
hout)
ioHandles _ = FilePath -> (Handle, Handle)
forall a. HasCallStack => FilePath -> a
error "expected ioHandles"
oeHandles :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> (Handle, Handle)
oeHandles :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> (Handle, Handle)
oeHandles (_, Just hout :: Handle
hout, Just herr :: Handle
herr, _) = (Handle
hout, Handle
herr)
oeHandles _ = FilePath -> (Handle, Handle)
forall a. HasCallStack => FilePath -> a
error "expected oeHandles"
processHandle :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> ProcessHandle
processHandle :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> ProcessHandle
processHandle (_, _, _, pid :: ProcessHandle
pid) = ProcessHandle
pid
showCmd :: CreateProcess -> String
showCmd :: CreateProcess -> FilePath
showCmd = CmdSpec -> FilePath
go (CmdSpec -> FilePath)
-> (CreateProcess -> CmdSpec) -> CreateProcess -> FilePath
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CreateProcess -> CmdSpec
cmdspec
where
go :: CmdSpec -> FilePath
go (ShellCommand s :: FilePath
s) = FilePath
s
go (RawCommand c :: FilePath
c ps :: [FilePath]
ps) = FilePath
c FilePath -> FilePath -> FilePath
forall a. [a] -> [a] -> [a]
++ " " FilePath -> FilePath -> FilePath
forall a. [a] -> [a] -> [a]
++ [FilePath] -> FilePath
forall a. Show a => a -> FilePath
show [FilePath]
ps
startInteractiveProcess
:: FilePath
-> [String]
-> Maybe [(String, String)]
-> IO (ProcessHandle, Handle, Handle)
startInteractiveProcess :: FilePath
-> [FilePath]
-> Maybe [(FilePath, FilePath)]
-> IO (ProcessHandle, Handle, Handle)
startInteractiveProcess cmd :: FilePath
cmd args :: [FilePath]
args environ :: Maybe [(FilePath, FilePath)]
environ = do
let p :: CreateProcess
p = (FilePath -> [FilePath] -> CreateProcess
proc FilePath
cmd [FilePath]
args)
{ std_in :: StdStream
std_in = StdStream
CreatePipe
, std_out :: StdStream
std_out = StdStream
CreatePipe
, std_err :: StdStream
std_err = StdStream
Inherit
, env :: Maybe [(FilePath, FilePath)]
env = Maybe [(FilePath, FilePath)]
environ
}
(Just from :: Handle
from, Just to :: Handle
to, _, pid :: ProcessHandle
pid) <- CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
createProcess CreateProcess
p
(ProcessHandle, Handle, Handle)
-> IO (ProcessHandle, Handle, Handle)
forall (m :: * -> *) a. Monad m => a -> m a
return (ProcessHandle
pid, Handle
to, Handle
from)
createProcess :: CreateProcess -> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
createProcess :: CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
createProcess p :: CreateProcess
p = do
CreateProcess -> IO ()
debugProcess CreateProcess
p
CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
Utility.Process.Shim.createProcess CreateProcess
p
debugProcess :: CreateProcess -> IO ()
debugProcess :: CreateProcess -> IO ()
debugProcess p :: CreateProcess
p = FilePath -> FilePath -> IO ()
debugM "Utility.Process" (FilePath -> IO ()) -> FilePath -> IO ()
forall a b. (a -> b) -> a -> b
$ [FilePath] -> FilePath
unwords
[ FilePath
action FilePath -> FilePath -> FilePath
forall a. [a] -> [a] -> [a]
++ ":"
, CreateProcess -> FilePath
showCmd CreateProcess
p
]
where
action :: FilePath
action
| StdStream -> Bool
piped (CreateProcess -> StdStream
std_in CreateProcess
p) Bool -> Bool -> Bool
&& StdStream -> Bool
piped (CreateProcess -> StdStream
std_out CreateProcess
p) = "chat"
| StdStream -> Bool
piped (CreateProcess -> StdStream
std_in CreateProcess
p) = "feed"
| StdStream -> Bool
piped (CreateProcess -> StdStream
std_out CreateProcess
p) = "read"
| Bool
otherwise = "call"
piped :: StdStream -> Bool
piped Inherit = Bool
False
piped _ = Bool
True
waitForProcess :: ProcessHandle -> IO ExitCode
waitForProcess :: ProcessHandle -> IO ExitCode
waitForProcess h :: ProcessHandle
h = do
ExitCode
r <- ProcessHandle -> IO ExitCode
Utility.Process.Shim.waitForProcess ProcessHandle
h
FilePath -> FilePath -> IO ()
debugM "Utility.Process" ("process done " FilePath -> FilePath -> FilePath
forall a. [a] -> [a] -> [a]
++ ExitCode -> FilePath
forall a. Show a => a -> FilePath
show ExitCode
r)
ExitCode -> IO ExitCode
forall (m :: * -> *) a. Monad m => a -> m a
return ExitCode
r