propellor-3.0.3: property-based host configuration management in haskell

Safe HaskellNone
LanguageHaskell98

Propellor.Utilities

Description

Re-exports some of propellor's internal utility modules.

These are used in the implementation of propellor, including some of its properties. However, there is no API stability; any of these can change or be removed without a major version number increase.

Use outside propellor at your own risk.

Synopsis

Documentation

read :: Read a => String -> a Source

head :: [a] -> a Source

tail :: [a] -> [a] Source

init :: [a] -> [a] Source

last :: [a] -> a Source

headMaybe :: [a] -> Maybe a Source

lastMaybe :: [a] -> Maybe a Source

beginning :: [a] -> [a] Source

end :: [a] -> [a] Source

data CreateProcess :: *

Constructors

CreateProcess 

Fields

cmdspec :: CmdSpec

Executable & arguments, or shell command

cwd :: Maybe FilePath

Optional path to the working directory for the new process

env :: Maybe [(String, String)]

Optional environment (otherwise inherit from the current process)

std_in :: StdStream

How to determine stdin

std_out :: StdStream

How to determine stdout

std_err :: StdStream

How to determine stderr

close_fds :: Bool

Close all file descriptors except stdin, stdout and stderr in the new process (on Windows, only works if std_in, std_out, and std_err are all Inherit)

create_group :: Bool

Create a new process group

delegate_ctlc :: Bool

Delegate control-C handling. Use this for interactive console processes to let them handle control-C themselves (see below for details).

On Windows this has no effect.

Since: 1.2.0.0

readProcess :: FilePath -> [String] -> IO String Source

Normally, when reading from a process, it does not need to be fed any standard input.

writeReadProcessEnv :: FilePath -> [String] -> Maybe [(String, String)] -> Maybe (Handle -> IO ()) -> Maybe (Handle -> IO ()) -> IO String Source

Runs an action to write to a process on its stdin, returns its output, and also allows specifying the environment.

forceSuccessProcess :: CreateProcess -> ProcessHandle -> IO () Source

Waits for a ProcessHandle, and throws an IOError if the process did not exit successfully.

checkSuccessProcess :: ProcessHandle -> IO Bool Source

Waits for a ProcessHandle and returns True if it exited successfully. Note that using this with createProcessChecked will throw away the Bool, and is only useful to ignore the exit code of a process, while still waiting for it. -}

createProcessSuccess :: CreateProcessRunner Source

Runs createProcess, then an action on its handles, and then forceSuccessProcess.

createProcessChecked :: (ProcessHandle -> IO b) -> CreateProcessRunner Source

Runs createProcess, then an action on its handles, and then a checker action on its exit code, which must wait for the process.

createBackgroundProcess :: CreateProcessRunner Source

Leaves the process running, suitable for lazy streaming. Note: Zombies will result, and must be waited on.

processTranscript :: String -> [String] -> Maybe String -> IO (String, Bool) Source

Runs a process, optionally feeding it some input, and returns a transcript combining its stdout and stderr, and whether it succeeded or failed.

withHandle :: StdHandle -> CreateProcessRunner -> CreateProcess -> (Handle -> IO a) -> IO a Source

Runs a CreateProcessRunner, on a CreateProcess structure, that is adjusted to pipe only from/to a single StdHandle, and passes the resulting Handle to an action.

withIOHandles :: CreateProcessRunner -> CreateProcess -> ((Handle, Handle) -> IO a) -> IO a Source

Like withHandle, but passes (stdin, stdout) handles to the action.

withOEHandles :: CreateProcessRunner -> CreateProcess -> ((Handle, Handle) -> IO a) -> IO a Source

Like withHandle, but passes (stdout, stderr) handles to the action.

withQuietOutput :: CreateProcessRunner -> CreateProcess -> IO () Source

Forces the CreateProcessRunner to run quietly; both stdout and stderr are discarded.

feedWithQuietOutput :: CreateProcessRunner -> CreateProcess -> (Handle -> IO a) -> IO a Source

Stdout and stderr are discarded, while the process is fed stdin from the handle.

waitForProcess :: ProcessHandle -> IO ExitCode Source

Wrapper around waitForProcess that does debug logging.

startInteractiveProcess :: FilePath -> [String] -> Maybe [(String, String)] -> IO (ProcessHandle, Handle, Handle) Source

Starts an interactive process. Unlike runInteractiveProcess in System.Process, stderr is inherited.

stdinHandle :: HandleExtractor Source

stdoutHandle :: HandleExtractor Source

stderrHandle :: HandleExtractor Source

catchMaybeIO :: MonadCatch m => m a -> m (Maybe a) Source

catchDefaultIO :: MonadCatch m => a -> m a -> m a Source

catchIO :: MonadCatch m => m a -> (IOException -> m a) -> m a Source

bracketIO :: (MonadMask m, MonadIO m) => IO v -> (v -> IO b) -> (v -> m a) -> m a Source

catchNonAsync :: MonadCatch m => m a -> (SomeException -> m a) -> m a Source

tryWhenExists :: MonadCatch m => m a -> m (Maybe a) Source

catchIOErrorType :: MonadCatch m => IOErrorType -> (IOException -> m a) -> m a -> m a Source

setEnv :: String -> String -> Bool -> IO () Source

addEntry :: Eq k => k -> v -> [(k, v)] -> [(k, v)] Source

addEntries :: Eq k => [(k, v)] -> [(k, v)] -> [(k, v)] Source

delEntry :: Eq k => k -> [(k, v)] -> [(k, v)] Source

type IsOpen = MVar () Source

readDirectory :: DirectoryHandle -> IO (Maybe FilePath) Source

Reads the next entry from the handle. Once the end of the directory is reached, returns Nothing and automatically closes the handle.

viaTmp :: (MonadMask m, MonadIO m) => (FilePath -> String -> m ()) -> FilePath -> String -> m () Source

withTmpFile :: (MonadIO m, MonadMask m) => Template -> (FilePath -> Handle -> m a) -> m a Source

withTmpFileIn :: (MonadIO m, MonadMask m) => FilePath -> Template -> (FilePath -> Handle -> m a) -> m a Source

withTmpDir :: (MonadMask m, MonadIO m) => Template -> (FilePath -> m a) -> m a Source

withTmpDirIn :: (MonadMask m, MonadIO m) => FilePath -> Template -> (FilePath -> m a) -> m a Source

firstM :: Monad m => (a -> m Bool) -> [a] -> m (Maybe a) Source

getM :: Monad m => (a -> m (Maybe b)) -> [a] -> m (Maybe b) Source

anyM :: Monad m => (a -> m Bool) -> [a] -> m Bool Source

allM :: Monad m => (a -> m Bool) -> [a] -> m Bool Source

untilTrue :: Monad m => [a] -> (a -> m Bool) -> m Bool Source

ifM :: Monad m => m Bool -> (m a, m a) -> m a Source

(<||>) :: Monad m => m Bool -> m Bool -> m Bool infixr 2 Source

(<&&>) :: Monad m => m Bool -> m Bool -> m Bool infixr 3 Source

observe :: Monad m => (a -> m b) -> m a -> m a Source

after :: Monad m => m b -> m a -> m a Source

noop :: Monad m => m () Source

separate :: (a -> Bool) -> [a] -> ([a], [a]) Source

segment :: (a -> Bool) -> [a] -> [[a]] Source

segmentDelim :: (a -> Bool) -> [a] -> [[a]] Source