{-# LANGUAGE TupleSections, ConstraintKinds #-}
module System.Process.Extra(
module System.Process,
system_, systemOutput, systemOutput_
) where
import Control.Monad
import System.IO.Extra
import System.Process
import System.Exit
import Data.Functor
import Partial
import Prelude
systemOutput :: String -> IO (ExitCode, String)
systemOutput :: String -> IO (ExitCode, String)
systemOutput String
x = (String -> IO (ExitCode, String)) -> IO (ExitCode, String)
forall a. (String -> IO a) -> IO a
withTempFile ((String -> IO (ExitCode, String)) -> IO (ExitCode, String))
-> (String -> IO (ExitCode, String)) -> IO (ExitCode, String)
forall a b. (a -> b) -> a -> b
$ \String
file -> do
ExitCode
exit <- String -> IOMode -> (Handle -> IO ExitCode) -> IO ExitCode
forall r. String -> IOMode -> (Handle -> IO r) -> IO r
withFile String
file IOMode
WriteMode ((Handle -> IO ExitCode) -> IO ExitCode)
-> (Handle -> IO ExitCode) -> IO ExitCode
forall a b. (a -> b) -> a -> b
$ \Handle
h -> do
(Maybe Handle
_, Maybe Handle
_, Maybe Handle
_, ProcessHandle
pid) <- CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
createProcess (String -> CreateProcess
shell String
x){std_out=UseHandle h, std_err=UseHandle h}
ProcessHandle -> IO ExitCode
waitForProcess ProcessHandle
pid
(ExitCode
exit,) (String -> (ExitCode, String))
-> IO String -> IO (ExitCode, String)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> String -> IO String
readFile' String
file
system_ :: Partial => String -> IO ()
system_ :: Partial => String -> IO ()
system_ String
x = do
ExitCode
res <- String -> IO ExitCode
system String
x
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (ExitCode
res ExitCode -> ExitCode -> Bool
forall a. Eq a => a -> a -> Bool
/= ExitCode
ExitSuccess) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$
String -> IO ()
forall a. Partial => String -> a
error (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ String
"Failed when running system command: " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
x
systemOutput_ :: Partial => String -> IO String
systemOutput_ :: Partial => String -> IO String
systemOutput_ String
x = do
(ExitCode
res,String
out) <- String -> IO (ExitCode, String)
systemOutput String
x
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (ExitCode
res ExitCode -> ExitCode -> Bool
forall a. Eq a => a -> a -> Bool
/= ExitCode
ExitSuccess) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$
String -> IO ()
forall a. Partial => String -> a
error (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ String
"Failed when running system command: " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
x
String -> IO String
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure String
out