shelly-1.12.1: shell-like (systems) programming in Haskell
Safe HaskellSafe-Inferred
LanguageHaskell2010

Shelly.Pipe

Description

This module is a wrapper for the module Shelly. The only difference is a main type Sh. In this module Sh contains a list of results. Actual definition of the type Sh is:

import qualified Shelly as S

newtype Sh a = Sh { unSh :: S.Sh [a] }

This definition can simplify some filesystem commands. A monad bind operator becomes a pipe operator and we can write

findExt ext = findWhen (pure . hasExt ext)

main :: IO ()
main = shs $ do
    mkdir "new"
    findExt "hs"  "." >>= flip cp "new"
    findExt "cpp" "." >>= rm_f
    liftIO $ putStrLn "done"

Documentation in this module mostly just reference documentation from the main Shelly module.

{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE ExtendedDefaultRules #-}
{-# OPTIONS_GHC -fno-warn-type-defaults #-}
import Shelly
import Data.Text as T
default (T.Text)
Synopsis

Entering Sh

data Sh a #

This type is a simple wrapper for a type Shelly.Sh. Sh contains a list of results.

Instances

Instances details
MonadIO Sh # 
Instance details

Defined in Shelly.Pipe

Methods

liftIO :: IO a -> Sh a #

Alternative Sh # 
Instance details

Defined in Shelly.Pipe

Methods

empty :: Sh a

(<|>) :: Sh a -> Sh a -> Sh a

some :: Sh a -> Sh [a]

many :: Sh a -> Sh [a]

Applicative Sh # 
Instance details

Defined in Shelly.Pipe

Methods

pure :: a -> Sh a

(<*>) :: Sh (a -> b) -> Sh a -> Sh b

liftA2 :: (a -> b -> c) -> Sh a -> Sh b -> Sh c

(*>) :: Sh a -> Sh b -> Sh b

(<*) :: Sh a -> Sh b -> Sh a

Functor Sh # 
Instance details

Defined in Shelly.Pipe

Methods

fmap :: (a -> b) -> Sh a -> Sh b

(<$) :: a -> Sh b -> Sh a

Monad Sh # 
Instance details

Defined in Shelly.Pipe

Methods

(>>=) :: Sh a -> (a -> Sh b) -> Sh b

(>>) :: Sh a -> Sh b -> Sh b

return :: a -> Sh a

MonadPlus Sh # 
Instance details

Defined in Shelly.Pipe

Methods

mzero :: Sh a

mplus :: Sh a -> Sh a -> Sh a

shs :: MonadIO m => Sh () -> m () #

Performs shelly and then an empty action return ().

shelly :: MonadIO m => Sh a -> m [a] #

see shelly

shellyFailDir :: MonadIO m => Sh a -> m [a] #

shsFailDir :: MonadIO m => Sh () -> m () #

Performs shellyFailDir and then an empty action return ().

sub :: Sh a -> Sh a #

see sub

silently :: Sh a -> Sh a #

verbosely :: Sh a -> Sh a #

escaping :: Bool -> Sh a -> Sh a #

print_stdout :: Bool -> Sh a -> Sh a #

print_commands :: Bool -> Sh a -> Sh a #

see 'S.print_commands

tracing :: Bool -> Sh a -> Sh a #

errExit :: Bool -> Sh a -> Sh a #

log_stdout_with :: (Text -> IO ()) -> Sh a -> Sh a #

log_stderr_with :: (Text -> IO ()) -> Sh a -> Sh a #

List functions

roll :: Sh [a] -> Sh a #

Pack list of results. It performs concat inside Sh.

unroll :: Sh a -> Sh [a] #

Unpack list of results.

liftSh :: ([a] -> [b]) -> Sh a -> Sh b #

Transform result as list. It can be useful for filtering.

Running external commands

type FoldCallback a = a -> Text -> a #

run :: FilePath -> [Text] -> Sh Text #

see run

run_ :: FilePath -> [Text] -> Sh () #

see run_

runFoldLines :: a -> FoldCallback a -> FilePath -> [Text] -> Sh a #

cmd :: ShellCommand result => FilePath -> result #

see cmd

(-|-) :: Sh Text -> Sh b -> Sh b #

see -|-

setStdin :: Text -> Sh () #

command :: FilePath -> [Text] -> [Text] -> Sh Text #

command_ :: FilePath -> [Text] -> [Text] -> Sh () #

command1 :: FilePath -> [Text] -> Text -> [Text] -> Sh Text #

command1_ :: FilePath -> [Text] -> Text -> [Text] -> Sh () #

sshPairs :: Text -> [(FilePath, [Text])] -> Sh Text #

sshPairs_ :: Text -> [(FilePath, [Text])] -> Sh () #

Modifying and querying environment

setenv :: Text -> Text -> Sh () #

see setenv

get_env :: Text -> Sh (Maybe Text) #

get_env_text :: Text -> Sh Text #

get_env_def :: Text -> Text -> Sh Text #

Deprecated: use fromMaybe DEFAULT get_env

see get_env_def

Environment directory

cd :: FilePath -> Sh () #

see cd

chdir :: FilePath -> Sh a -> Sh a #

see chdir

Printing

echo :: Text -> Sh () #

Echo text to standard (error, when using _err variants) output. The _n variants do not print a final newline.

echo_n :: Text -> Sh () #

Echo text to standard (error, when using _err variants) output. The _n variants do not print a final newline.

echo_err :: Text -> Sh () #

Echo text to standard (error, when using _err variants) output. The _n variants do not print a final newline.

echo_n_err :: Text -> Sh () #

Echo text to standard (error, when using _err variants) output. The _n variants do not print a final newline.

inspect :: Show s => s -> Sh () #

inspect_err :: Show s => s -> Sh () #

tag :: Sh a -> Text -> Sh a #

see tag

trace :: Text -> Sh () #

see trace

show_command :: FilePath -> [Text] -> Text #

Querying filesystem

lsT :: FilePath -> Sh Text #

see lsT

test_e :: FilePath -> Sh Bool #

see test_e

test_f :: FilePath -> Sh Bool #

see test_f

test_d :: FilePath -> Sh Bool #

see test_d

test_s :: FilePath -> Sh Bool #

see test_s

which :: FilePath -> Sh (Maybe FilePath) #

see 'S.which

Filename helpers

(</>) :: (ToFilePath filepath1, ToFilePath filepath2) => filepath1 -> filepath2 -> FilePath #

Uses System.FilePath, but can automatically convert a Text.

(<.>) :: ToFilePath filepath => filepath -> Text -> FilePath #

Uses System.FilePath, but can automatically convert a Text.

relativeTo #

Arguments

:: FilePath

anchor path, the prefix

-> FilePath

make this relative to anchor path

-> Sh FilePath 

hasExt :: Text -> FilePath -> Bool #

Flipped hasExtension for Text.

Manipulating filesystem

mv :: FilePath -> FilePath -> Sh () #

see mv

rm :: FilePath -> Sh () #

see rm

rm_f :: FilePath -> Sh () #

see rm_f

rm_rf :: FilePath -> Sh () #

see rm_rf

cp :: FilePath -> FilePath -> Sh () #

see cp

cp_r :: FilePath -> FilePath -> Sh () #

see cp_r

mkdir :: FilePath -> Sh () #

see mkdir

mkdirTree :: Tree FilePath -> Sh () #

reading/writing Files

readfile :: FilePath -> Sh Text #

readBinary :: FilePath -> Sh ByteString #

writefile :: FilePath -> Text -> Sh () #

appendfile :: FilePath -> Text -> Sh () #

withTmpDir :: (FilePath -> Sh a) -> Sh a #

exiting the program

exit :: Int -> Sh () #

see exit

errorExit :: Text -> Sh () #

quietExit :: Int -> Sh () #

terror :: Text -> Sh a #

see terror

Exceptions

catchany :: IO a -> (SomeException -> IO a) -> IO a #

A helper to catch any exception (same as ... catch (e :: SomeException) -> ...).

catch_sh :: Exception e => Sh a -> (e -> Sh a) -> Sh a #

finally_sh :: Sh a -> Sh b -> Sh a #

data ShellyHandler a #

Constructors

forall e.Exception e => ShellyHandler (e -> Sh a) 

catchany_sh :: Sh a -> (SomeException -> Sh a) -> Sh a #

convert between Text and FilePath

fromText :: Text -> FilePath #

Convert Text to a FilePath.

Utilities

(<$>) :: Functor f => (a -> b) -> f a -> f b #

whenM :: Monad m => m Bool -> m () -> m () #

A monadic-conditional version of the when guard.

unlessM :: Monad m => m Bool -> m () -> m () #

A monadic-conditional version of the unless guard.

time :: Sh a -> Sh (Double, a) #

see time

Re-exported for your convenience

liftIO :: MonadIO m => IO a -> m a #

when :: Applicative f => Bool -> f () -> f () #

unless :: Applicative f => Bool -> f () -> f () #

type FilePath = String #

internal functions for writing extensions

get :: Sh State #

put :: State -> Sh () #

find functions

findFold :: (a -> FilePath -> Sh a) -> a -> FilePath -> Sh a #

findDirFilterWhen #

Arguments

:: (FilePath -> Sh Bool)

directory filter

-> (FilePath -> Sh Bool)

file filter

-> FilePath

directory

-> Sh FilePath 

findFoldDirFilter :: (a -> FilePath -> Sh a) -> a -> (FilePath -> Sh Bool) -> FilePath -> Sh a #

followSymlink :: Bool -> Sh a -> Sh a #