summaryrefslogtreecommitdiff
path: root/lib/ProcessUtils.hs
diff options
context:
space:
mode:
authorjoe <joe@jerkface.net>2016-04-27 19:33:09 -0400
committerjoe <joe@jerkface.net>2016-04-27 19:33:09 -0400
commit4048a2857dbb3eddd78e864ad12fe8e04efc98d2 (patch)
tree21fa0380f6c842bbda8afbb0e1d7ffd9baaf8f89 /lib/ProcessUtils.hs
parentdd7f4f6e0e8d932979caa9ab70030aacce18b64a (diff)
runExternal utility for piped process io.
Diffstat (limited to 'lib/ProcessUtils.hs')
-rw-r--r--lib/ProcessUtils.hs49
1 files changed, 48 insertions, 1 deletions
diff --git a/lib/ProcessUtils.hs b/lib/ProcessUtils.hs
index a6902be..492d666 100644
--- a/lib/ProcessUtils.hs
+++ b/lib/ProcessUtils.hs
@@ -1,4 +1,5 @@
1{-# LANGUAGE CPP #-} 1{-# LANGUAGE CPP #-}
2{-# LANGUAGE OverloadedStrings #-}
2module ProcessUtils 3module ProcessUtils
3 ( ExitCode(ExitFailure,ExitSuccess) 4 ( ExitCode(ExitFailure,ExitSuccess)
4 , systemEnv 5 , systemEnv
@@ -7,16 +8,19 @@ module ProcessUtils
7 ) where 8 ) where
8 9
9import GHC.IO.Exception ( ioException, IOErrorType(..) ) 10import GHC.IO.Exception ( ioException, IOErrorType(..) )
11import System.FilePath
12import System.Directory
10import System.Process 13import System.Process
11import System.Posix.Signals 14import System.Posix.Signals
12import System.Process.Internals (runGenProcess_,defaultSignal) 15import System.Process.Internals (runGenProcess_,defaultSignal)
13import System.Environment 16import System.Environment
14import Data.Maybe ( isNothing ) 17import Data.Maybe ( isNothing, fromMaybe )
15import System.IO.Error ( mkIOError, ioeSetErrorString ) 18import System.IO.Error ( mkIOError, ioeSetErrorString )
16import System.Exit ( ExitCode(..) ) 19import System.Exit ( ExitCode(..) )
17import System.IO 20import System.IO
18import Control.Applicative 21import Control.Applicative
19import Control.Exception (bracket) 22import Control.Exception (bracket)
23import qualified Data.ByteString as S
20 24
21 25
22-- | systemEnv 26-- | systemEnv
@@ -102,3 +106,46 @@ readProcessWithErrorH cmd args stdin erH = do
102 hPutStr sinh stdin 106 hPutStr sinh stdin
103 hClose sinh 107 hClose sinh
104 hGetContents sout ) 108 hGetContents sout )
109
110-- | run an external command.
111--
112-- Arguments:
113--
114-- [ cmd ] command to run
115--
116-- [ input ] input to command (if any)
117--
118-- Returns:
119--
120-- [ code ] exit code returned by command
121--
122-- [ output ] captured stdout of command
123--
124-- [ err ] captured stderr of command
125runExternal :: String -> Maybe String -> IO (Int,(S.ByteString,S.ByteString))
126runExternal cmd input = do
127 cwd <- getCurrentDirectory
128 putStr $ takeFileName cwd ++ "> " ++ cmd
129 ++ case input of
130 Nothing -> "\n"
131 Just s -> " <<EOF\n" ++ s ++ "EOF\n"
132 let p = (shell cmd) { std_in = maybe Inherit (const CreatePipe) input
133 , std_out = CreatePipe
134 , std_err = CreatePipe }
135 (mb_in,mb_out,mb_err,process) <- createProcess p
136 case mb_in of
137 Nothing -> return ()
138 Just hin -> hPutStr hin (fromMaybe "" input) >> hClose hin
139 out <- case mb_out of
140 Just hout -> S.hGetContents hout
141 Nothing -> return ""
142 err <- case mb_err of
143 Just herr -> S.hGetContents herr
144 Nothing -> return ""
145 code <- do
146 c <- waitForProcess process
147 return $ case c of
148 ExitSuccess -> 0
149 ExitFailure x -> x
150 return (code,(out,err))
151