| Safe Haskell | Safe-Inferred |
|---|
System.Process.Streaming.Tutorial
Contents
Description
Introduction
These examples require the OverloadedStrings extension.
Some preliminary imports:
module Main where import Data.Bifunctor import Data.Monoid import qualified Data.Attoparsec.Text as A import Control.Applicative import Control.Lens (view) import Pipes import qualified Pipes.ByteString as B import qualified Pipes.Prelude as P import qualified Pipes.Parse as P import qualified Pipes.Attoparsec as P import qualified Pipes.Text as T import qualified Pipes.Text.Encoding as T import qualified Pipes.Text.IO as T import qualified Pipes.Group as G import qualified Pipes.Safe as S import qualified Pipes.Safe.Prelude as S import System.IO import System.Process.Streaming
stdin and stderr to different files
Using separate to consume stdout and stderr concurrently, and functions
from pipes-safe to write the files.
example1 :: IO (Either String ((),()))
example1 = exitCode show $
execute program show $ separate
(consume "stdout.log")
(consume "stderr.log")
where
consume file = surely . safely . useConsumer $
S.withFile file WriteMode B.toHandle
program = shell "{ echo ooo ; echo eee 1>&2 ; }"
Missing executable
Missing executables and other IOExceptions are converted to an error type e
and returned in the Left of an Either:
example2 :: IO (Either String ((),()))
example2 = exitCode show $
execute (proc "fsdfsdf" []) show $ separate
nop
nop
Returns:
>>>Left "fsdfsdf: createProcess: runInteractiveProcess: exec: does not exist (No such file or directory)"
Combining stdout and stderr
Here we use combineLines to process stdout and stderr together.
Notice that they are consumed together as Text. We have to specify a decoding
function for each stream, and a LeftoverPolicy as well.
We also add a prefix to the lines coming from stderr.
example3 :: IO (Either String ())
example3 = exitCode show $
execute program show $ combineLines
(linePolicy T.decodeIso8859_1 id policy)
(linePolicy T.decodeIso8859_1 annotate policy)
(surely . safely . useConsumer $
S.withFile "combined.txt" WriteMode T.toHandle)
where
policy = failOnLeftovers $ \_ _->"badbytes"
annotate x = P.yield "errprefix: " *> x
program = shell "{ echo ooo ; echo eee 1>&2 ; echo ppp ; echo ffff 1>&2 ; }"
Running two parsers in parallel
Plugging parsers from pipes-parse into separate or combineLines is easy
because running evalStateT on a parser returns a function that consumes a
Producer.
In this example we define two Attoparsec Text parsers and we convert them to
Pipes parsers using function parse from package pipes-attoparsec.
Stdout is decoded to Text and parsed by the two parsers in parallel using the
auxiliary forkProd function. The results are aggregated in a tuple.
Stderr is ignored using the nop function.
parseChars :: Char -> A.Parser [Char]
parseChars c = fmap mconcat $
many (A.notChar c) *> A.many1 (some (A.char c) <* many (A.notChar c))
parser1 = parseChars 'o'
parser2 = parseChars 'a'
example4 ::IO (Either String (([Char], [Char]),()))
example4 = exitCode show $
execute program show $ separate
(encoding T.decodeIso8859_1 (failOnLeftovers $ \_ _->"badbytes") $
forkProd (P.evalStateT $ adapt parser1)
(P.evalStateT $ adapt parser2))
nop
where
adapt p = bimap (const "parse error") id <$> P.parse p
program = shell "{ echo ooaaoo ; echo aaooaoa; }"
Returns:
>>>Right (("ooooooo","aaaaaa"),())
Aborting an execution
If any function consuming a standard stream returns with an error value e,
the external program is terminated and the computation returns immediately with
e.
example5 ::IO (Either String ((),()))
example5 = exitCode show $
execute (shell "sleep 10s") show $ separate
(\_ -> return $ Left "fast return!")
nop
Returns:
>>>Left "fast return!"
If we change the stdout consuming function to nop, example5 waits 10
seconds.
Feeding stdin, collecting stdout as text
In this example we invoke the cat command, feeding its input stream with a
ByteString.
We decode stdout to Text and collect the whole output using a fold from
pipes-text.
Plugging folds defined in Pipes.Prelude (or pipes-bytestring or
pipes-text) into separate or combineLines is easy because the folds
return functions that consume Producers. Folds form the foldl package
could also be useful here.
Notice that stdin is written concurrently with the reading of stdout. It is
not the case that sdtin is written first and then stdout is read.
example6 = exitCode show $
execute3 (shell "cat") show
(surely . useProducer $ yield "aaaaaa\naaaaa")
(separate
(encoding T.decodeIso8859_1 ignoreLeftovers $ surely $ T.toLazyM)
nop
)
Returns:
>>>Right ((),("aaaaaa\naaaaa",()))
Collecting stdout and stderr as bytestring
In this example we collect stdout and stderr as lazy bytestrings, using a
fold defined in pipes-bytestring.
example7 = exitCode show $
execute program show $ separate (surely B.toLazyM) (surely B.toLazyM)
where
program = shell "{ echo ooo ; echo eee 1>&2 ; echo ppp ; echo ffff 1>&2 ; }"
Returns:
>>>Right ("ooo\nppp\n","eee\nffff\n")
Counting words
In this example we count words emitted to stdout in a streaming fashing,
without having to keep whole words in memory.
We use a lens from pipes-text to split the text into words, and a trivial
fold from pipes-group to create a Producer of Int values. Then we sum the
ints using a fold from Pipes.Prelude.
example8 = exitCode show $
execute program show $ separate
(encoding T.decodeIso8859_1 ignoreLeftovers $ surely $
P.sum . G.folds const () (const 1) . view T.words
)
nop
where
program = shell "{ echo aaa ; echo bbb ; echo ccc ; }"
ghci
Sometimes it's useful to launch external programs during a ghci session, like this:
>>>a <- async $ execute (proc "xeyes" []) show $ separate nop nop
Cancelling the async causes the termination of the external program:
>>>cancel a
Waiting for the async returns the result:
>>>wait a