{-# LANGUAGE CPP #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE ViewPatterns #-}
module Turtle.Prelude (
echo
, err
, readline
, Internal.readTextFile
, Internal.writeTextFile
, arguments
#if __GLASGOW_HASKELL__ >= 710
, export
, unset
#endif
, need
, env
, cd
, pwd
, home
, readlink
, realpath
, mv
, mkdir
, mktree
, cp
, cptree
, cptreeL
#if !defined(mingw32_HOST_OS)
, symlink
#endif
, isNotSymbolicLink
, rm
, rmdir
, rmtree
, testfile
, testdir
, testpath
, date
, datefile
, touch
, time
, hostname
, which
, whichAll
, sleep
, exit
, die
, (.&&.)
, (.||.)
, readonly
, writeonly
, appendonly
, mktemp
, mktempfile
, mktempdir
, fork
, wait
, pushd
, stdin
, input
, inhandle
, stdout
, output
, outhandle
, append
, stderr
, strict
, ls
, lsif
, lstree
, lsdepth
, cat
, grep
, grepText
, sed
, sedPrefix
, sedSuffix
, sedEntire
, onFiles
, inplace
, inplacePrefix
, inplaceSuffix
, inplaceEntire
, update
, find
, findtree
, yes
, nl
, paste
, endless
, limit
, limitWhile
, cache
, parallel
, single
, uniq
, uniqOn
, uniqBy
, nub
, nubOn
, sort
, sortOn
, sortBy
, toLines
, countChars
, countWords
, countLines
, cut
, proc
, shell
, procs
, shells
, inproc
, inshell
, inprocWithErr
, inshellWithErr
, procStrict
, shellStrict
, procStrictWithErr
, shellStrictWithErr
, system
, stream
, streamWithErr
, systemStrict
, systemStrictWithErr
, Permissions(..)
, chmod
, getmod
, setmod
, copymod
, readable, nonreadable
, writable, nonwritable
, executable, nonexecutable
, ooo,roo,owo,oox,rwo,rox,owx,rwx
, du
, Size(B, KB, MB, GB, TB, KiB, MiB, GiB, TiB)
, sz
, bytes
, kilobytes
, megabytes
, gigabytes
, terabytes
, kibibytes
, mebibytes
, gibibytes
, tebibytes
, PosixCompat.FileStatus
, stat
, lstat
, fileSize
, accessTime
, modificationTime
, statusChangeTime
, PosixCompat.isBlockDevice
, PosixCompat.isCharacterDevice
, PosixCompat.isNamedPipe
, PosixCompat.isRegularFile
, PosixCompat.isDirectory
, PosixCompat.isSymbolicLink
, PosixCompat.isSocket
, cmin
, cmax
, WithHeader(..)
, header
, ProcFailed(..)
, ShellFailed(..)
) where
import Control.Applicative
import Control.Concurrent (threadDelay)
import Control.Concurrent.Async
(Async, withAsync, waitSTM, concurrently,
Concurrently(..))
import qualified Control.Concurrent.Async
import Control.Concurrent.MVar (newMVar, modifyMVar_)
import qualified Control.Concurrent.STM as STM
import qualified Control.Concurrent.STM.TQueue as TQueue
import Control.Exception (Exception, bracket, bracket_, finally, mask, throwIO)
import Control.Foldl (Fold(..), genericLength, handles, list, premap)
import qualified Control.Foldl
import qualified Control.Foldl.Text
import Control.Monad (foldM, guard, liftM, msum, when, unless, (>=>), mfilter)
import Control.Monad.IO.Class (MonadIO(..))
import Control.Monad.Managed (MonadManaged(..), managed, managed_, runManaged)
#ifdef mingw32_HOST_OS
import Data.Bits ((.&.))
#endif
import Data.IORef (newIORef, readIORef, writeIORef)
import qualified Data.List as List
import Data.List.NonEmpty (NonEmpty(..))
import qualified Data.List.NonEmpty as NonEmpty
import Data.Monoid ((<>))
import Data.Ord (comparing)
import qualified Data.Set as Set
import Data.Text (Text, pack, unpack)
import Data.Time (NominalDiffTime, UTCTime, getCurrentTime)
import Data.Time.Clock.POSIX (POSIXTime, posixSecondsToUTCTime)
import Data.Traversable
import qualified Data.Text as Text
import qualified Data.Text.IO as Text
import Data.Typeable (Typeable)
import GHC.IO.Exception (IOErrorType(UnsupportedOperation))
import Network.HostName (getHostName)
import System.Clock (Clock(..), TimeSpec(..), getTime)
import System.Environment (
getArgs,
#if __GLASGOW_HASKELL__ >= 710
setEnv,
unsetEnv,
#endif
#if __GLASGOW_HASKELL__ >= 708
lookupEnv,
#endif
getEnvironment )
import qualified System.Directory as Directory
import System.FilePath ((</>))
import qualified System.FilePath as FilePath
import System.Exit (ExitCode(..), exitWith)
import System.IO (Handle, hClose)
import qualified System.IO as IO
import System.IO.Temp (withTempDirectory, withTempFile)
import System.IO.Error
(catchIOError, ioeGetErrorType, isPermissionError, isDoesNotExistError)
import qualified System.PosixCompat as PosixCompat
import qualified System.Process as Process
#ifdef mingw32_HOST_OS
import qualified System.Win32 as Win32
#else
import System.Posix (
openDirStream,
readDirStream,
closeDirStream,
touchFile )
import System.Posix.Files (createSymbolicLink)
#endif
import Prelude hiding (lines)
import Turtle.Pattern (Pattern, anyChar, chars, match, selfless, sepBy)
import Turtle.Shell
import Turtle.Format (Format, format, makeFormat, d, w, (%), fp)
import qualified Turtle.Internal as Internal
import Turtle.Line
proc
:: MonadIO io
=> Text
-> [Text]
-> Shell Line
-> io ExitCode
proc :: Text -> [Text] -> Shell Line -> io ExitCode
proc Text
cmd [Text]
args =
CreateProcess -> Shell Line -> io ExitCode
forall (io :: * -> *).
MonadIO io =>
CreateProcess -> Shell Line -> io ExitCode
system
( (FilePath -> [FilePath] -> CreateProcess
Process.proc (Text -> FilePath
unpack Text
cmd) ((Text -> FilePath) -> [Text] -> [FilePath]
forall a b. (a -> b) -> [a] -> [b]
map Text -> FilePath
unpack [Text]
args))
{ std_in :: StdStream
Process.std_in = StdStream
Process.CreatePipe
, std_out :: StdStream
Process.std_out = StdStream
Process.Inherit
, std_err :: StdStream
Process.std_err = StdStream
Process.Inherit
} )
shell
:: MonadIO io
=> Text
-> Shell Line
-> io ExitCode
shell :: Text -> Shell Line -> io ExitCode
shell Text
cmdLine =
CreateProcess -> Shell Line -> io ExitCode
forall (io :: * -> *).
MonadIO io =>
CreateProcess -> Shell Line -> io ExitCode
system
( (FilePath -> CreateProcess
Process.shell (Text -> FilePath
unpack Text
cmdLine))
{ std_in :: StdStream
Process.std_in = StdStream
Process.CreatePipe
, std_out :: StdStream
Process.std_out = StdStream
Process.Inherit
, std_err :: StdStream
Process.std_err = StdStream
Process.Inherit
} )
data ProcFailed = ProcFailed
{ ProcFailed -> Text
procCommand :: Text
, ProcFailed -> [Text]
procArguments :: [Text]
, ProcFailed -> ExitCode
procExitCode :: ExitCode
} deriving (Int -> ProcFailed -> ShowS
[ProcFailed] -> ShowS
ProcFailed -> FilePath
(Int -> ProcFailed -> ShowS)
-> (ProcFailed -> FilePath)
-> ([ProcFailed] -> ShowS)
-> Show ProcFailed
forall a.
(Int -> a -> ShowS) -> (a -> FilePath) -> ([a] -> ShowS) -> Show a
showList :: [ProcFailed] -> ShowS
$cshowList :: [ProcFailed] -> ShowS
show :: ProcFailed -> FilePath
$cshow :: ProcFailed -> FilePath
showsPrec :: Int -> ProcFailed -> ShowS
$cshowsPrec :: Int -> ProcFailed -> ShowS
Show, Typeable)
instance Exception ProcFailed
procs
:: MonadIO io
=> Text
-> [Text]
-> Shell Line
-> io ()
procs :: Text -> [Text] -> Shell Line -> io ()
procs Text
cmd [Text]
args Shell Line
s = do
ExitCode
exitCode <- Text -> [Text] -> Shell Line -> io ExitCode
forall (io :: * -> *).
MonadIO io =>
Text -> [Text] -> Shell Line -> io ExitCode
proc Text
cmd [Text]
args Shell Line
s
case ExitCode
exitCode of
ExitCode
ExitSuccess -> () -> io ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
ExitCode
_ -> IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (ProcFailed -> IO ()
forall e a. Exception e => e -> IO a
throwIO (Text -> [Text] -> ExitCode -> ProcFailed
ProcFailed Text
cmd [Text]
args ExitCode
exitCode))
data ShellFailed = ShellFailed
{ ShellFailed -> Text
shellCommandLine :: Text
, ShellFailed -> ExitCode
shellExitCode :: ExitCode
} deriving (Int -> ShellFailed -> ShowS
[ShellFailed] -> ShowS
ShellFailed -> FilePath
(Int -> ShellFailed -> ShowS)
-> (ShellFailed -> FilePath)
-> ([ShellFailed] -> ShowS)
-> Show ShellFailed
forall a.
(Int -> a -> ShowS) -> (a -> FilePath) -> ([a] -> ShowS) -> Show a
showList :: [ShellFailed] -> ShowS
$cshowList :: [ShellFailed] -> ShowS
show :: ShellFailed -> FilePath
$cshow :: ShellFailed -> FilePath
showsPrec :: Int -> ShellFailed -> ShowS
$cshowsPrec :: Int -> ShellFailed -> ShowS
Show, Typeable)
instance Exception ShellFailed
shells
:: MonadIO io
=> Text
-> Shell Line
-> io ()
shells :: Text -> Shell Line -> io ()
shells Text
cmdline Shell Line
s = do
ExitCode
exitCode <- Text -> Shell Line -> io ExitCode
forall (io :: * -> *).
MonadIO io =>
Text -> Shell Line -> io ExitCode
shell Text
cmdline Shell Line
s
case ExitCode
exitCode of
ExitCode
ExitSuccess -> () -> io ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
ExitCode
_ -> IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (ShellFailed -> IO ()
forall e a. Exception e => e -> IO a
throwIO (Text -> ExitCode -> ShellFailed
ShellFailed Text
cmdline ExitCode
exitCode))
procStrict
:: MonadIO io
=> Text
-> [Text]
-> Shell Line
-> io (ExitCode, Text)
procStrict :: Text -> [Text] -> Shell Line -> io (ExitCode, Text)
procStrict Text
cmd [Text]
args =
CreateProcess -> Shell Line -> io (ExitCode, Text)
forall (io :: * -> *).
MonadIO io =>
CreateProcess -> Shell Line -> io (ExitCode, Text)
systemStrict (FilePath -> [FilePath] -> CreateProcess
Process.proc (Text -> FilePath
Text.unpack Text
cmd) ((Text -> FilePath) -> [Text] -> [FilePath]
forall a b. (a -> b) -> [a] -> [b]
map Text -> FilePath
Text.unpack [Text]
args))
shellStrict
:: MonadIO io
=> Text
-> Shell Line
-> io (ExitCode, Text)
shellStrict :: Text -> Shell Line -> io (ExitCode, Text)
shellStrict Text
cmdLine = CreateProcess -> Shell Line -> io (ExitCode, Text)
forall (io :: * -> *).
MonadIO io =>
CreateProcess -> Shell Line -> io (ExitCode, Text)
systemStrict (FilePath -> CreateProcess
Process.shell (Text -> FilePath
Text.unpack Text
cmdLine))
procStrictWithErr
:: MonadIO io
=> Text
-> [Text]
-> Shell Line
-> io (ExitCode, Text, Text)
procStrictWithErr :: Text -> [Text] -> Shell Line -> io (ExitCode, Text, Text)
procStrictWithErr Text
cmd [Text]
args =
CreateProcess -> Shell Line -> io (ExitCode, Text, Text)
forall (io :: * -> *).
MonadIO io =>
CreateProcess -> Shell Line -> io (ExitCode, Text, Text)
systemStrictWithErr (FilePath -> [FilePath] -> CreateProcess
Process.proc (Text -> FilePath
Text.unpack Text
cmd) ((Text -> FilePath) -> [Text] -> [FilePath]
forall a b. (a -> b) -> [a] -> [b]
map Text -> FilePath
Text.unpack [Text]
args))
shellStrictWithErr
:: MonadIO io
=> Text
-> Shell Line
-> io (ExitCode, Text, Text)
shellStrictWithErr :: Text -> Shell Line -> io (ExitCode, Text, Text)
shellStrictWithErr Text
cmdLine =
CreateProcess -> Shell Line -> io (ExitCode, Text, Text)
forall (io :: * -> *).
MonadIO io =>
CreateProcess -> Shell Line -> io (ExitCode, Text, Text)
systemStrictWithErr (FilePath -> CreateProcess
Process.shell (Text -> FilePath
Text.unpack Text
cmdLine))
halt :: Async a -> IO ()
halt :: Async a -> IO ()
halt Async a
a = do
Maybe (Either SomeException a)
m <- Async a -> IO (Maybe (Either SomeException a))
forall a. Async a -> IO (Maybe (Either SomeException a))
Control.Concurrent.Async.poll Async a
a
case Maybe (Either SomeException a)
m of
Maybe (Either SomeException a)
Nothing -> Async a -> IO ()
forall a. Async a -> IO ()
Control.Concurrent.Async.cancel Async a
a
Just (Left SomeException
e) -> SomeException -> IO ()
forall e a. Exception e => e -> IO a
throwIO SomeException
e
Just (Right a
_) -> () -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
system
:: MonadIO io
=> Process.CreateProcess
-> Shell Line
-> io ExitCode
system :: CreateProcess -> Shell Line -> io ExitCode
system CreateProcess
p Shell Line
s = IO ExitCode -> io ExitCode
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
let open :: IO (Maybe Handle, ProcessHandle)
open = do
(Maybe Handle
m, Maybe Handle
Nothing, Maybe Handle
Nothing, ProcessHandle
ph) <- CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
Process.createProcess CreateProcess
p
case Maybe Handle
m of
Just Handle
hIn -> Handle -> BufferMode -> IO ()
IO.hSetBuffering Handle
hIn BufferMode
IO.LineBuffering
Maybe Handle
_ -> () -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
(Maybe Handle, ProcessHandle) -> IO (Maybe Handle, ProcessHandle)
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe Handle
m, ProcessHandle
ph)
MVar Bool
mvar <- Bool -> IO (MVar Bool)
forall a. a -> IO (MVar a)
newMVar Bool
False
let close :: Handle -> IO ()
close Handle
handle = do
MVar Bool -> (Bool -> IO Bool) -> IO ()
forall a. MVar a -> (a -> IO a) -> IO ()
modifyMVar_ MVar Bool
mvar (\Bool
finalized -> do
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless Bool
finalized (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> IO ()
hClose Handle
handle))
Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True )
let close' :: (Maybe Handle, ProcessHandle) -> IO ()
close' (Just Handle
hIn, ProcessHandle
ph) = do
Handle -> IO ()
close Handle
hIn
ProcessHandle -> IO ()
Process.terminateProcess ProcessHandle
ph
close' (Maybe Handle
Nothing , ProcessHandle
ph) = do
ProcessHandle -> IO ()
Process.terminateProcess ProcessHandle
ph
let handle :: (Maybe Handle, ProcessHandle) -> IO ExitCode
handle (Just Handle
hIn, ProcessHandle
ph) = do
let feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore =
IO () -> IO ()
forall a. IO a -> IO a
restore (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> Shell Line -> IO ()
forall (io :: * -> *). MonadIO io => Handle -> Shell Line -> io ()
outhandle Handle
hIn Shell Line
s)) IO () -> IO () -> IO ()
forall a b. IO a -> IO b -> IO a
`finally` Handle -> IO ()
close Handle
hIn
((forall a. IO a -> IO a) -> IO ExitCode) -> IO ExitCode
forall b. ((forall a. IO a -> IO a) -> IO b) -> IO b
mask (\forall a. IO a -> IO a
restore ->
IO () -> (Async () -> IO ExitCode) -> IO ExitCode
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync ((forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore) (\Async ()
a ->
IO ExitCode -> IO ExitCode
forall a. IO a -> IO a
restore (ProcessHandle -> IO ExitCode
Process.waitForProcess ProcessHandle
ph) IO ExitCode -> IO () -> IO ExitCode
forall a b. IO a -> IO b -> IO a
`finally` Async () -> IO ()
forall a. Async a -> IO ()
halt Async ()
a) )
handle (Maybe Handle
Nothing , ProcessHandle
ph) = do
ProcessHandle -> IO ExitCode
Process.waitForProcess ProcessHandle
ph
IO (Maybe Handle, ProcessHandle)
-> ((Maybe Handle, ProcessHandle) -> IO ())
-> ((Maybe Handle, ProcessHandle) -> IO ExitCode)
-> IO ExitCode
forall a b c. IO a -> (a -> IO b) -> (a -> IO c) -> IO c
bracket IO (Maybe Handle, ProcessHandle)
open (Maybe Handle, ProcessHandle) -> IO ()
close' (Maybe Handle, ProcessHandle) -> IO ExitCode
handle )
systemStrict
:: MonadIO io
=> Process.CreateProcess
-> Shell Line
-> io (ExitCode, Text)
systemStrict :: CreateProcess -> Shell Line -> io (ExitCode, Text)
systemStrict CreateProcess
p Shell Line
s = IO (ExitCode, Text) -> io (ExitCode, Text)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
let p' :: CreateProcess
p' = CreateProcess
p
{ std_in :: StdStream
Process.std_in = StdStream
Process.CreatePipe
, std_out :: StdStream
Process.std_out = StdStream
Process.CreatePipe
, std_err :: StdStream
Process.std_err = StdStream
Process.Inherit
}
let open :: IO (Handle, Handle, ProcessHandle)
open = do
(Just Handle
hIn, Just Handle
hOut, Maybe Handle
Nothing, ProcessHandle
ph) <- IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
Process.createProcess CreateProcess
p')
Handle -> BufferMode -> IO ()
IO.hSetBuffering Handle
hIn BufferMode
IO.LineBuffering
(Handle, Handle, ProcessHandle)
-> IO (Handle, Handle, ProcessHandle)
forall (m :: * -> *) a. Monad m => a -> m a
return (Handle
hIn, Handle
hOut, ProcessHandle
ph)
MVar Bool
mvar <- Bool -> IO (MVar Bool)
forall a. a -> IO (MVar a)
newMVar Bool
False
let close :: Handle -> IO ()
close Handle
handle = do
MVar Bool -> (Bool -> IO Bool) -> IO ()
forall a. MVar a -> (a -> IO a) -> IO ()
modifyMVar_ MVar Bool
mvar (\Bool
finalized -> do
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless Bool
finalized (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> IO ()
hClose Handle
handle))
Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True )
IO (Handle, Handle, ProcessHandle)
-> ((Handle, Handle, ProcessHandle) -> IO ())
-> ((Handle, Handle, ProcessHandle) -> IO (ExitCode, Text))
-> IO (ExitCode, Text)
forall a b c. IO a -> (a -> IO b) -> (a -> IO c) -> IO c
bracket IO (Handle, Handle, ProcessHandle)
open (\(Handle
hIn, Handle
_, ProcessHandle
ph) -> Handle -> IO ()
close Handle
hIn IO () -> IO () -> IO ()
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ProcessHandle -> IO ()
Process.terminateProcess ProcessHandle
ph) (\(Handle
hIn, Handle
hOut, ProcessHandle
ph) -> do
let feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore =
IO () -> IO ()
forall a. IO a -> IO a
restore (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> Shell Line -> IO ()
forall (io :: * -> *). MonadIO io => Handle -> Shell Line -> io ()
outhandle Handle
hIn Shell Line
s)) IO () -> IO () -> IO ()
forall a b. IO a -> IO b -> IO a
`finally` Handle -> IO ()
close Handle
hIn
IO ExitCode -> IO Text -> IO (ExitCode, Text)
forall a b. IO a -> IO b -> IO (a, b)
concurrently
(((forall a. IO a -> IO a) -> IO ExitCode) -> IO ExitCode
forall b. ((forall a. IO a -> IO a) -> IO b) -> IO b
mask (\forall a. IO a -> IO a
restore ->
IO () -> (Async () -> IO ExitCode) -> IO ExitCode
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync ((forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore) (\Async ()
a ->
IO ExitCode -> IO ExitCode
forall a. IO a -> IO a
restore (IO ExitCode -> IO ExitCode
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (ProcessHandle -> IO ExitCode
Process.waitForProcess ProcessHandle
ph)) IO ExitCode -> IO () -> IO ExitCode
forall a b. IO a -> IO b -> IO a
`finally` Async () -> IO ()
forall a. Async a -> IO ()
halt Async ()
a ) ))
(Handle -> IO Text
Text.hGetContents Handle
hOut) ) )
systemStrictWithErr
:: MonadIO io
=> Process.CreateProcess
-> Shell Line
-> io (ExitCode, Text, Text)
systemStrictWithErr :: CreateProcess -> Shell Line -> io (ExitCode, Text, Text)
systemStrictWithErr CreateProcess
p Shell Line
s = IO (ExitCode, Text, Text) -> io (ExitCode, Text, Text)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
let p' :: CreateProcess
p' = CreateProcess
p
{ std_in :: StdStream
Process.std_in = StdStream
Process.CreatePipe
, std_out :: StdStream
Process.std_out = StdStream
Process.CreatePipe
, std_err :: StdStream
Process.std_err = StdStream
Process.CreatePipe
}
let open :: IO (Handle, Handle, Handle, ProcessHandle)
open = do
(Just Handle
hIn, Just Handle
hOut, Just Handle
hErr, ProcessHandle
ph) <- IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
Process.createProcess CreateProcess
p')
Handle -> BufferMode -> IO ()
IO.hSetBuffering Handle
hIn BufferMode
IO.LineBuffering
(Handle, Handle, Handle, ProcessHandle)
-> IO (Handle, Handle, Handle, ProcessHandle)
forall (m :: * -> *) a. Monad m => a -> m a
return (Handle
hIn, Handle
hOut, Handle
hErr, ProcessHandle
ph)
MVar Bool
mvar <- Bool -> IO (MVar Bool)
forall a. a -> IO (MVar a)
newMVar Bool
False
let close :: Handle -> IO ()
close Handle
handle = do
MVar Bool -> (Bool -> IO Bool) -> IO ()
forall a. MVar a -> (a -> IO a) -> IO ()
modifyMVar_ MVar Bool
mvar (\Bool
finalized -> do
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless Bool
finalized (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> IO ()
hClose Handle
handle))
Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True )
IO (Handle, Handle, Handle, ProcessHandle)
-> ((Handle, Handle, Handle, ProcessHandle) -> IO ())
-> ((Handle, Handle, Handle, ProcessHandle)
-> IO (ExitCode, Text, Text))
-> IO (ExitCode, Text, Text)
forall a b c. IO a -> (a -> IO b) -> (a -> IO c) -> IO c
bracket IO (Handle, Handle, Handle, ProcessHandle)
open (\(Handle
hIn, Handle
_, Handle
_, ProcessHandle
ph) -> Handle -> IO ()
close Handle
hIn IO () -> IO () -> IO ()
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ProcessHandle -> IO ()
Process.terminateProcess ProcessHandle
ph) (\(Handle
hIn, Handle
hOut, Handle
hErr, ProcessHandle
ph) -> do
let feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore =
IO () -> IO ()
forall a. IO a -> IO a
restore (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> Shell Line -> IO ()
forall (io :: * -> *). MonadIO io => Handle -> Shell Line -> io ()
outhandle Handle
hIn Shell Line
s)) IO () -> IO () -> IO ()
forall a b. IO a -> IO b -> IO a
`finally` Handle -> IO ()
close Handle
hIn
Concurrently (ExitCode, Text, Text) -> IO (ExitCode, Text, Text)
forall a. Concurrently a -> IO a
runConcurrently (Concurrently (ExitCode, Text, Text) -> IO (ExitCode, Text, Text))
-> Concurrently (ExitCode, Text, Text) -> IO (ExitCode, Text, Text)
forall a b. (a -> b) -> a -> b
$ (,,)
(ExitCode -> Text -> Text -> (ExitCode, Text, Text))
-> Concurrently ExitCode
-> Concurrently (Text -> Text -> (ExitCode, Text, Text))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> IO ExitCode -> Concurrently ExitCode
forall a. IO a -> Concurrently a
Concurrently (((forall a. IO a -> IO a) -> IO ExitCode) -> IO ExitCode
forall b. ((forall a. IO a -> IO a) -> IO b) -> IO b
mask (\forall a. IO a -> IO a
restore ->
IO () -> (Async () -> IO ExitCode) -> IO ExitCode
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync ((forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore) (\Async ()
a ->
IO ExitCode -> IO ExitCode
forall a. IO a -> IO a
restore (IO ExitCode -> IO ExitCode
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (ProcessHandle -> IO ExitCode
Process.waitForProcess ProcessHandle
ph)) IO ExitCode -> IO () -> IO ExitCode
forall a b. IO a -> IO b -> IO a
`finally` Async () -> IO ()
forall a. Async a -> IO ()
halt Async ()
a ) ))
Concurrently (Text -> Text -> (ExitCode, Text, Text))
-> Concurrently Text
-> Concurrently (Text -> (ExitCode, Text, Text))
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> IO Text -> Concurrently Text
forall a. IO a -> Concurrently a
Concurrently (Handle -> IO Text
Text.hGetContents Handle
hOut)
Concurrently (Text -> (ExitCode, Text, Text))
-> Concurrently Text -> Concurrently (ExitCode, Text, Text)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> IO Text -> Concurrently Text
forall a. IO a -> Concurrently a
Concurrently (Handle -> IO Text
Text.hGetContents Handle
hErr) ) )
inproc
:: Text
-> [Text]
-> Shell Line
-> Shell Line
inproc :: Text -> [Text] -> Shell Line -> Shell Line
inproc Text
cmd [Text]
args = CreateProcess -> Shell Line -> Shell Line
stream (FilePath -> [FilePath] -> CreateProcess
Process.proc (Text -> FilePath
unpack Text
cmd) ((Text -> FilePath) -> [Text] -> [FilePath]
forall a b. (a -> b) -> [a] -> [b]
map Text -> FilePath
unpack [Text]
args))
inshell
:: Text
-> Shell Line
-> Shell Line
inshell :: Text -> Shell Line -> Shell Line
inshell Text
cmd = CreateProcess -> Shell Line -> Shell Line
stream (FilePath -> CreateProcess
Process.shell (Text -> FilePath
unpack Text
cmd))
waitForProcessThrows :: Process.ProcessHandle -> IO ()
waitForProcessThrows :: ProcessHandle -> IO ()
waitForProcessThrows ProcessHandle
ph = do
ExitCode
exitCode <- ProcessHandle -> IO ExitCode
Process.waitForProcess ProcessHandle
ph
case ExitCode
exitCode of
ExitCode
ExitSuccess -> () -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
ExitFailure Int
_ -> ExitCode -> IO ()
forall e a. Exception e => e -> IO a
Control.Exception.throwIO ExitCode
exitCode
stream
:: Process.CreateProcess
-> Shell Line
-> Shell Line
stream :: CreateProcess -> Shell Line -> Shell Line
stream CreateProcess
p Shell Line
s = do
let p' :: CreateProcess
p' = CreateProcess
p
{ std_in :: StdStream
Process.std_in = StdStream
Process.CreatePipe
, std_out :: StdStream
Process.std_out = StdStream
Process.CreatePipe
, std_err :: StdStream
Process.std_err = StdStream
Process.Inherit
}
let open :: IO (Handle, Handle, ProcessHandle)
open = do
(Just Handle
hIn, Just Handle
hOut, Maybe Handle
Nothing, ProcessHandle
ph) <- IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
Process.createProcess CreateProcess
p')
Handle -> BufferMode -> IO ()
IO.hSetBuffering Handle
hIn BufferMode
IO.LineBuffering
(Handle, Handle, ProcessHandle)
-> IO (Handle, Handle, ProcessHandle)
forall (m :: * -> *) a. Monad m => a -> m a
return (Handle
hIn, Handle
hOut, ProcessHandle
ph)
MVar Bool
mvar <- IO (MVar Bool) -> Shell (MVar Bool)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Bool -> IO (MVar Bool)
forall a. a -> IO (MVar a)
newMVar Bool
False)
let close :: Handle -> IO ()
close Handle
handle = do
MVar Bool -> (Bool -> IO Bool) -> IO ()
forall a. MVar a -> (a -> IO a) -> IO ()
modifyMVar_ MVar Bool
mvar (\Bool
finalized -> do
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless Bool
finalized (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> IO ()
hClose Handle
handle))
Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True )
(Handle
hIn, Handle
hOut, ProcessHandle
ph) <- Managed (Handle, Handle, ProcessHandle)
-> Shell (Handle, Handle, ProcessHandle)
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using ((forall r. ((Handle, Handle, ProcessHandle) -> IO r) -> IO r)
-> Managed (Handle, Handle, ProcessHandle)
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (IO (Handle, Handle, ProcessHandle)
-> ((Handle, Handle, ProcessHandle) -> IO ())
-> ((Handle, Handle, ProcessHandle) -> IO r)
-> IO r
forall a b c. IO a -> (a -> IO b) -> (a -> IO c) -> IO c
bracket IO (Handle, Handle, ProcessHandle)
open (\(Handle
hIn, Handle
_, ProcessHandle
ph) -> Handle -> IO ()
close Handle
hIn IO () -> IO () -> IO ()
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ProcessHandle -> IO ()
Process.terminateProcess ProcessHandle
ph)))
let feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore = IO () -> IO ()
forall a. IO a -> IO a
restore (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> Shell Line -> IO ()
forall (io :: * -> *). MonadIO io => Handle -> Shell Line -> io ()
outhandle Handle
hIn Shell Line
s)) IO () -> IO () -> IO ()
forall a b. IO a -> IO b -> IO a
`finally` Handle -> IO ()
close Handle
hIn
Async ()
a <- Managed (Async ()) -> Shell (Async ())
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using
((forall r. (Async () -> IO r) -> IO r) -> Managed (Async ())
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (\Async () -> IO r
k ->
((forall a. IO a -> IO a) -> IO r) -> IO r
forall b. ((forall a. IO a -> IO a) -> IO b) -> IO b
mask (\forall a. IO a -> IO a
restore -> IO () -> (Async () -> IO r) -> IO r
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync ((forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore) (IO r -> IO r
forall a. IO a -> IO a
restore (IO r -> IO r) -> (Async () -> IO r) -> Async () -> IO r
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Async () -> IO r
k))))
Handle -> Shell Line
inhandle Handle
hOut Shell Line -> Shell Line -> Shell Line
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (ProcessHandle -> IO ()
waitForProcessThrows ProcessHandle
ph IO () -> IO () -> IO ()
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> Async () -> IO ()
forall a. Async a -> IO ()
halt Async ()
a) Shell () -> Shell Line -> Shell Line
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> Shell Line
forall (f :: * -> *) a. Alternative f => f a
empty)
streamWithErr
:: Process.CreateProcess
-> Shell Line
-> Shell (Either Line Line)
streamWithErr :: CreateProcess -> Shell Line -> Shell (Either Line Line)
streamWithErr CreateProcess
p Shell Line
s = do
let p' :: CreateProcess
p' = CreateProcess
p
{ std_in :: StdStream
Process.std_in = StdStream
Process.CreatePipe
, std_out :: StdStream
Process.std_out = StdStream
Process.CreatePipe
, std_err :: StdStream
Process.std_err = StdStream
Process.CreatePipe
}
let open :: IO (Handle, Handle, Handle, ProcessHandle)
open = do
(Just Handle
hIn, Just Handle
hOut, Just Handle
hErr, ProcessHandle
ph) <- IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
Process.createProcess CreateProcess
p')
Handle -> BufferMode -> IO ()
IO.hSetBuffering Handle
hIn BufferMode
IO.LineBuffering
(Handle, Handle, Handle, ProcessHandle)
-> IO (Handle, Handle, Handle, ProcessHandle)
forall (m :: * -> *) a. Monad m => a -> m a
return (Handle
hIn, Handle
hOut, Handle
hErr, ProcessHandle
ph)
MVar Bool
mvar <- IO (MVar Bool) -> Shell (MVar Bool)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Bool -> IO (MVar Bool)
forall a. a -> IO (MVar a)
newMVar Bool
False)
let close :: Handle -> IO ()
close Handle
handle = do
MVar Bool -> (Bool -> IO Bool) -> IO ()
forall a. MVar a -> (a -> IO a) -> IO ()
modifyMVar_ MVar Bool
mvar (\Bool
finalized -> do
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless Bool
finalized (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> IO ()
hClose Handle
handle))
Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True )
(Handle
hIn, Handle
hOut, Handle
hErr, ProcessHandle
ph) <- Managed (Handle, Handle, Handle, ProcessHandle)
-> Shell (Handle, Handle, Handle, ProcessHandle)
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using ((forall r.
((Handle, Handle, Handle, ProcessHandle) -> IO r) -> IO r)
-> Managed (Handle, Handle, Handle, ProcessHandle)
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (IO (Handle, Handle, Handle, ProcessHandle)
-> ((Handle, Handle, Handle, ProcessHandle) -> IO ())
-> ((Handle, Handle, Handle, ProcessHandle) -> IO r)
-> IO r
forall a b c. IO a -> (a -> IO b) -> (a -> IO c) -> IO c
bracket IO (Handle, Handle, Handle, ProcessHandle)
open (\(Handle
hIn, Handle
_, Handle
_, ProcessHandle
ph) -> Handle -> IO ()
close Handle
hIn IO () -> IO () -> IO ()
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ProcessHandle -> IO ()
Process.terminateProcess ProcessHandle
ph)))
let feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn :: (forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore = IO () -> IO ()
forall a. IO a -> IO a
restore (IO () -> IO ()
Internal.ignoreSIGPIPE (Handle -> Shell Line -> IO ()
forall (io :: * -> *). MonadIO io => Handle -> Shell Line -> io ()
outhandle Handle
hIn Shell Line
s)) IO () -> IO () -> IO ()
forall a b. IO a -> IO b -> IO a
`finally` Handle -> IO ()
close Handle
hIn
TQueue (Maybe (Either Line Line))
queue <- IO (TQueue (Maybe (Either Line Line)))
-> Shell (TQueue (Maybe (Either Line Line)))
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO IO (TQueue (Maybe (Either Line Line)))
forall a. IO (TQueue a)
TQueue.newTQueueIO
let forwardOut :: (forall a. IO a -> IO a) -> IO ()
forwardOut :: (forall a. IO a -> IO a) -> IO ()
forwardOut forall a. IO a -> IO a
restore =
IO () -> IO ()
forall a. IO a -> IO a
restore (Shell () -> IO ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
Line
line <- Handle -> Shell Line
inhandle Handle
hOut
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (TQueue (Maybe (Either Line Line))
-> Maybe (Either Line Line) -> STM ()
forall a. TQueue a -> a -> STM ()
TQueue.writeTQueue TQueue (Maybe (Either Line Line))
queue (Either Line Line -> Maybe (Either Line Line)
forall a. a -> Maybe a
Just (Line -> Either Line Line
forall a b. b -> Either a b
Right Line
line)))) ))
IO () -> IO () -> IO ()
forall a b. IO a -> IO b -> IO a
`finally` STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (TQueue (Maybe (Either Line Line))
-> Maybe (Either Line Line) -> STM ()
forall a. TQueue a -> a -> STM ()
TQueue.writeTQueue TQueue (Maybe (Either Line Line))
queue Maybe (Either Line Line)
forall a. Maybe a
Nothing)
let forwardErr :: (forall a. IO a -> IO a) -> IO ()
forwardErr :: (forall a. IO a -> IO a) -> IO ()
forwardErr forall a. IO a -> IO a
restore =
IO () -> IO ()
forall a. IO a -> IO a
restore (Shell () -> IO ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
Line
line <- Handle -> Shell Line
inhandle Handle
hErr
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (TQueue (Maybe (Either Line Line))
-> Maybe (Either Line Line) -> STM ()
forall a. TQueue a -> a -> STM ()
TQueue.writeTQueue TQueue (Maybe (Either Line Line))
queue (Either Line Line -> Maybe (Either Line Line)
forall a. a -> Maybe a
Just (Line -> Either Line Line
forall a b. a -> Either a b
Left Line
line)))) ))
IO () -> IO () -> IO ()
forall a b. IO a -> IO b -> IO a
`finally` STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (TQueue (Maybe (Either Line Line))
-> Maybe (Either Line Line) -> STM ()
forall a. TQueue a -> a -> STM ()
TQueue.writeTQueue TQueue (Maybe (Either Line Line))
queue Maybe (Either Line Line)
forall a. Maybe a
Nothing)
let drain :: Shell (Either Line Line)
drain = (forall r. FoldShell (Either Line Line) r -> IO r)
-> Shell (Either Line Line)
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell (\(FoldShell x -> Either Line Line -> IO x
step x
begin x -> IO r
done) -> do
let loop :: x -> a -> IO x
loop x
x a
numNothing
| a
numNothing a -> a -> Bool
forall a. Ord a => a -> a -> Bool
< a
2 = do
Maybe (Either Line Line)
m <- STM (Maybe (Either Line Line)) -> IO (Maybe (Either Line Line))
forall a. STM a -> IO a
STM.atomically (TQueue (Maybe (Either Line Line)) -> STM (Maybe (Either Line Line))
forall a. TQueue a -> STM a
TQueue.readTQueue TQueue (Maybe (Either Line Line))
queue)
case Maybe (Either Line Line)
m of
Maybe (Either Line Line)
Nothing -> x -> a -> IO x
loop x
x (a -> IO x) -> a -> IO x
forall a b. (a -> b) -> a -> b
$! a
numNothing a -> a -> a
forall a. Num a => a -> a -> a
+ a
1
Just Either Line Line
e -> do
x
x' <- x -> Either Line Line -> IO x
step x
x Either Line Line
e
x -> a -> IO x
loop x
x' a
numNothing
| Bool
otherwise = x -> IO x
forall (m :: * -> *) a. Monad m => a -> m a
return x
x
x
x1 <- x -> Int -> IO x
forall a. (Ord a, Num a) => x -> a -> IO x
loop x
begin (Int
0 :: Int)
x -> IO r
done x
x1 )
Async ()
a <- Managed (Async ()) -> Shell (Async ())
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using
((forall r. (Async () -> IO r) -> IO r) -> Managed (Async ())
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (\Async () -> IO r
k ->
((forall a. IO a -> IO a) -> IO r) -> IO r
forall b. ((forall a. IO a -> IO a) -> IO b) -> IO b
mask (\forall a. IO a -> IO a
restore -> IO () -> (Async () -> IO r) -> IO r
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync ((forall a. IO a -> IO a) -> IO ()
feedIn forall a. IO a -> IO a
restore) (IO r -> IO r
forall a. IO a -> IO a
restore (IO r -> IO r) -> (Async () -> IO r) -> Async () -> IO r
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Async () -> IO r
k)) ))
Async ()
b <- Managed (Async ()) -> Shell (Async ())
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using
((forall r. (Async () -> IO r) -> IO r) -> Managed (Async ())
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (\Async () -> IO r
k ->
((forall a. IO a -> IO a) -> IO r) -> IO r
forall b. ((forall a. IO a -> IO a) -> IO b) -> IO b
mask (\forall a. IO a -> IO a
restore -> IO () -> (Async () -> IO r) -> IO r
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync ((forall a. IO a -> IO a) -> IO ()
forwardOut forall a. IO a -> IO a
restore) (IO r -> IO r
forall a. IO a -> IO a
restore (IO r -> IO r) -> (Async () -> IO r) -> Async () -> IO r
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Async () -> IO r
k)) ))
Async ()
c <- Managed (Async ()) -> Shell (Async ())
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using
((forall r. (Async () -> IO r) -> IO r) -> Managed (Async ())
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (\Async () -> IO r
k ->
((forall a. IO a -> IO a) -> IO r) -> IO r
forall b. ((forall a. IO a -> IO a) -> IO b) -> IO b
mask (\forall a. IO a -> IO a
restore -> IO () -> (Async () -> IO r) -> IO r
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync ((forall a. IO a -> IO a) -> IO ()
forwardErr forall a. IO a -> IO a
restore) (IO r -> IO r
forall a. IO a -> IO a
restore (IO r -> IO r) -> (Async () -> IO r) -> Async () -> IO r
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Async () -> IO r
k)) ))
let STM a
l also :: STM a -> STM a -> STM ()
`also` STM a
r = do
a
_ <- STM a
l STM a -> STM a -> STM a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (STM a
r STM a -> STM a -> STM a
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> STM a
forall a. STM a
STM.retry)
a
_ <- STM a
r
() -> STM ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
let waitAll :: IO ()
waitAll = STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (Async () -> STM ()
forall a. Async a -> STM a
waitSTM Async ()
a STM () -> STM () -> STM ()
forall a a. STM a -> STM a -> STM ()
`also` (Async () -> STM ()
forall a. Async a -> STM a
waitSTM Async ()
b STM () -> STM () -> STM ()
forall a a. STM a -> STM a -> STM ()
`also` Async () -> STM ()
forall a. Async a -> STM a
waitSTM Async ()
c))
Shell (Either Line Line)
drain Shell (Either Line Line)
-> Shell (Either Line Line) -> Shell (Either Line Line)
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (ProcessHandle -> IO ()
waitForProcessThrows ProcessHandle
ph IO () -> IO () -> IO ()
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> IO ()
waitAll) Shell () -> Shell (Either Line Line) -> Shell (Either Line Line)
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> Shell (Either Line Line)
forall (f :: * -> *) a. Alternative f => f a
empty)
inprocWithErr
:: Text
-> [Text]
-> Shell Line
-> Shell (Either Line Line)
inprocWithErr :: Text -> [Text] -> Shell Line -> Shell (Either Line Line)
inprocWithErr Text
cmd [Text]
args =
CreateProcess -> Shell Line -> Shell (Either Line Line)
streamWithErr (FilePath -> [FilePath] -> CreateProcess
Process.proc (Text -> FilePath
unpack Text
cmd) ((Text -> FilePath) -> [Text] -> [FilePath]
forall a b. (a -> b) -> [a] -> [b]
map Text -> FilePath
unpack [Text]
args))
inshellWithErr
:: Text
-> Shell Line
-> Shell (Either Line Line)
inshellWithErr :: Text -> Shell Line -> Shell (Either Line Line)
inshellWithErr Text
cmd = CreateProcess -> Shell Line -> Shell (Either Line Line)
streamWithErr (FilePath -> CreateProcess
Process.shell (Text -> FilePath
unpack Text
cmd))
echo :: MonadIO io => Line -> io ()
echo :: Line -> io ()
echo Line
line = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Text -> IO ()
Text.putStrLn (Line -> Text
lineToText Line
line))
err :: MonadIO io => Line -> io ()
err :: Line -> io ()
err Line
line = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Handle -> Text -> IO ()
Text.hPutStrLn Handle
IO.stderr (Line -> Text
lineToText Line
line))
readline :: MonadIO io => io (Maybe Line)
readline :: io (Maybe Line)
readline = IO (Maybe Line) -> io (Maybe Line)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
Bool
eof <- IO Bool
IO.isEOF
if Bool
eof
then Maybe Line -> IO (Maybe Line)
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe Line
forall a. Maybe a
Nothing
else (FilePath -> Maybe Line) -> IO FilePath -> IO (Maybe Line)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (Line -> Maybe Line
forall a. a -> Maybe a
Just (Line -> Maybe Line)
-> (FilePath -> Line) -> FilePath -> Maybe Line
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Line
unsafeTextToLine (Text -> Line) -> (FilePath -> Text) -> FilePath -> Line
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> Text
pack) IO FilePath
getLine )
arguments :: MonadIO io => io [Text]
arguments :: io [Text]
arguments = IO [Text] -> io [Text]
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (([FilePath] -> [Text]) -> IO [FilePath] -> IO [Text]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ((FilePath -> Text) -> [FilePath] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map FilePath -> Text
pack) IO [FilePath]
getArgs)
#if __GLASGOW_HASKELL__ >= 710
export :: MonadIO io => Text -> Text -> io ()
export :: Text -> Text -> io ()
export Text
key Text
val = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> FilePath -> IO ()
setEnv (Text -> FilePath
unpack Text
key) (Text -> FilePath
unpack Text
val))
unset :: MonadIO io => Text -> io ()
unset :: Text -> io ()
unset Text
key = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO ()
unsetEnv (Text -> FilePath
unpack Text
key))
#endif
need :: MonadIO io => Text -> io (Maybe Text)
#if __GLASGOW_HASKELL__ >= 708
need :: Text -> io (Maybe Text)
need Text
key = IO (Maybe Text) -> io (Maybe Text)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO ((Maybe FilePath -> Maybe Text)
-> IO (Maybe FilePath) -> IO (Maybe Text)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ((FilePath -> Text) -> Maybe FilePath -> Maybe Text
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap FilePath -> Text
pack) (FilePath -> IO (Maybe FilePath)
lookupEnv (Text -> FilePath
unpack Text
key)))
#else
need key = liftM (lookup key) env
#endif
env :: MonadIO io => io [(Text, Text)]
env :: io [(Text, Text)]
env = IO [(Text, Text)] -> io [(Text, Text)]
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (([(FilePath, FilePath)] -> [(Text, Text)])
-> IO [(FilePath, FilePath)] -> IO [(Text, Text)]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (((FilePath, FilePath) -> (Text, Text))
-> [(FilePath, FilePath)] -> [(Text, Text)]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (FilePath, FilePath) -> (Text, Text)
toTexts) IO [(FilePath, FilePath)]
getEnvironment)
where
toTexts :: (FilePath, FilePath) -> (Text, Text)
toTexts (FilePath
key, FilePath
val) = (FilePath -> Text
pack FilePath
key, FilePath -> Text
pack FilePath
val)
cd :: MonadIO io => FilePath -> io ()
cd :: FilePath -> io ()
cd FilePath
path = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO ()
Directory.setCurrentDirectory FilePath
path)
pushd :: MonadManaged managed => FilePath -> managed ()
pushd :: FilePath -> managed ()
pushd FilePath
path = do
FilePath
cwd <- managed FilePath
forall (io :: * -> *). MonadIO io => io FilePath
pwd
Managed () -> managed ()
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using ((forall a. IO a -> IO a) -> Managed ()
forall (m :: * -> *).
MonadManaged m =>
(forall a. IO a -> IO a) -> m ()
managed_ (IO () -> IO () -> IO r -> IO r
forall a b c. IO a -> IO b -> IO c -> IO c
bracket_ (FilePath -> IO ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
cd FilePath
path) (FilePath -> IO ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
cd FilePath
cwd)))
pwd :: MonadIO io => io FilePath
pwd :: io FilePath
pwd = IO FilePath -> io FilePath
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO IO FilePath
Directory.getCurrentDirectory
home :: MonadIO io => io FilePath
home :: io FilePath
home = IO FilePath -> io FilePath
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO IO FilePath
Directory.getHomeDirectory
readlink :: MonadIO io => FilePath -> io FilePath
readlink :: FilePath -> io FilePath
readlink FilePath
path = IO FilePath -> io FilePath
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO FilePath
Directory.getSymbolicLinkTarget FilePath
path)
realpath :: MonadIO io => FilePath -> io FilePath
realpath :: FilePath -> io FilePath
realpath FilePath
path = IO FilePath -> io FilePath
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO FilePath
Directory.canonicalizePath FilePath
path)
#ifdef mingw32_HOST_OS
fILE_ATTRIBUTE_REPARSE_POINT :: Win32.FileAttributeOrFlag
fILE_ATTRIBUTE_REPARSE_POINT = 1024
reparsePoint :: Win32.FileAttributeOrFlag -> Bool
reparsePoint attr = fILE_ATTRIBUTE_REPARSE_POINT .&. attr /= 0
#endif
ls :: FilePath -> Shell FilePath
ls :: FilePath -> Shell FilePath
ls FilePath
path = (forall r. FoldShell FilePath r -> IO r) -> Shell FilePath
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell (\(FoldShell x -> FilePath -> IO x
step x
begin x -> IO r
done) -> do
let path' :: FilePath
path' = FilePath
path
Bool
canRead <- (Permissions -> Bool) -> IO Permissions -> IO Bool
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap
Permissions -> Bool
Directory.readable
(FilePath -> IO Permissions
Directory.getPermissions (ShowS
deslash FilePath
path'))
#ifdef mingw32_HOST_OS
reparse <- fmap reparsePoint (Win32.getFileAttributes path')
if (canRead && not reparse)
then bracket
(Win32.findFirstFile (path </> "*"))
(\(h, _) -> Win32.findClose h)
(\(h, fdat) -> do
let loop x = do
file <- Win32.getFindDataFileName fdat
x' <- if (file /= "." && file /= "..")
then step x (path </> file)
else return x
more <- Win32.findNextFile h fdat
if more then loop $! x' else done x'
loop $! begin )
else done begin )
#else
if Bool
canRead
then IO DirStream -> (DirStream -> IO ()) -> (DirStream -> IO r) -> IO r
forall a b c. IO a -> (a -> IO b) -> (a -> IO c) -> IO c
bracket (FilePath -> IO DirStream
openDirStream FilePath
path') DirStream -> IO ()
closeDirStream (\DirStream
dirp -> do
let loop :: x -> IO r
loop x
x = do
FilePath
file <- DirStream -> IO FilePath
readDirStream DirStream
dirp
case FilePath
file of
FilePath
"" -> x -> IO r
done x
x
FilePath
_ -> do
x
x' <- if (FilePath
file FilePath -> FilePath -> Bool
forall a. Eq a => a -> a -> Bool
/= FilePath
"." Bool -> Bool -> Bool
&& FilePath
file FilePath -> FilePath -> Bool
forall a. Eq a => a -> a -> Bool
/= FilePath
"..")
then x -> FilePath -> IO x
step x
x (FilePath
path FilePath -> ShowS
</> FilePath
file)
else x -> IO x
forall (m :: * -> *) a. Monad m => a -> m a
return x
x
x -> IO r
loop (x -> IO r) -> x -> IO r
forall a b. (a -> b) -> a -> b
$! x
x'
x -> IO r
loop (x -> IO r) -> x -> IO r
forall a b. (a -> b) -> a -> b
$! x
begin )
else x -> IO r
done x
begin )
#endif
deslash :: String -> String
deslash :: ShowS
deslash [] = []
deslash (Char
c0:FilePath
cs0) = Char
c0Char -> ShowS
forall a. a -> [a] -> [a]
:ShowS
go FilePath
cs0
where
go :: ShowS
go [] = []
go [Char
'\\'] = []
go (Char
c:FilePath
cs) = Char
cChar -> ShowS
forall a. a -> [a] -> [a]
:ShowS
go FilePath
cs
lstree :: FilePath -> Shell FilePath
lstree :: FilePath -> Shell FilePath
lstree FilePath
path = do
FilePath
child <- FilePath -> Shell FilePath
ls FilePath
path
Bool
isDir <- FilePath -> Shell Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testdir FilePath
child
if Bool
isDir
then FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
child Shell FilePath -> Shell FilePath -> Shell FilePath
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FilePath -> Shell FilePath
lstree FilePath
child
else FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
child
lsdepth :: Int -> Int -> FilePath -> Shell FilePath
lsdepth :: Int -> Int -> FilePath -> Shell FilePath
lsdepth Int
mn Int
mx FilePath
path =
Int -> Int -> Int -> FilePath -> Shell FilePath
lsdepthHelper Int
1 Int
mn Int
mx FilePath
path
where
lsdepthHelper :: Int -> Int -> Int -> FilePath -> Shell FilePath
lsdepthHelper :: Int -> Int -> Int -> FilePath -> Shell FilePath
lsdepthHelper Int
depth Int
l Int
u FilePath
p =
if Int
depth Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
> Int
u
then Shell FilePath
forall (f :: * -> *) a. Alternative f => f a
empty
else do
FilePath
child <- FilePath -> Shell FilePath
ls FilePath
p
Bool
isDir <- FilePath -> Shell Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testdir FilePath
child
if Bool
isDir
then if Int
depth Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
>= Int
l
then FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
child Shell FilePath -> Shell FilePath -> Shell FilePath
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Int -> Int -> Int -> FilePath -> Shell FilePath
lsdepthHelper (Int
depth Int -> Int -> Int
forall a. Num a => a -> a -> a
+ Int
1) Int
l Int
u FilePath
child
else Int -> Int -> Int -> FilePath -> Shell FilePath
lsdepthHelper (Int
depth Int -> Int -> Int
forall a. Num a => a -> a -> a
+ Int
1) Int
l Int
u FilePath
child
else if Int
depth Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
>= Int
l
then FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
child
else Shell FilePath
forall (f :: * -> *) a. Alternative f => f a
empty
lsif :: (FilePath -> IO Bool) -> FilePath -> Shell FilePath
lsif :: (FilePath -> IO Bool) -> FilePath -> Shell FilePath
lsif FilePath -> IO Bool
predicate FilePath
path = do
FilePath
child <- FilePath -> Shell FilePath
ls FilePath
path
Bool
isDir <- FilePath -> Shell Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testdir FilePath
child
if Bool
isDir
then do
Bool
continue <- IO Bool -> Shell Bool
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO Bool
predicate FilePath
child)
if Bool
continue
then FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
child Shell FilePath -> Shell FilePath -> Shell FilePath
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (FilePath -> IO Bool) -> FilePath -> Shell FilePath
lsif FilePath -> IO Bool
predicate FilePath
child
else FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
child
else FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
child
mv :: MonadIO io => FilePath -> FilePath -> io ()
mv :: FilePath -> FilePath -> io ()
mv FilePath
oldPath FilePath
newPath = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> io ()) -> IO () -> io ()
forall a b. (a -> b) -> a -> b
$ IO () -> (IOError -> IO ()) -> IO ()
forall a. IO a -> (IOError -> IO a) -> IO a
catchIOError (FilePath -> FilePath -> IO ()
Directory.renameFile FilePath
oldPath FilePath
newPath)
(\IOError
ioe -> if IOError -> IOErrorType
ioeGetErrorType IOError
ioe IOErrorType -> IOErrorType -> Bool
forall a. Eq a => a -> a -> Bool
== IOErrorType
UnsupportedOperation
then do
FilePath -> FilePath -> IO ()
Directory.copyFile FilePath
oldPath FilePath
newPath
FilePath -> IO ()
Directory.removeFile FilePath
oldPath
else IOError -> IO ()
forall a. IOError -> IO a
ioError IOError
ioe)
mkdir :: MonadIO io => FilePath -> io ()
mkdir :: FilePath -> io ()
mkdir FilePath
path = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO ()
Directory.createDirectory FilePath
path)
mktree :: MonadIO io => FilePath -> io ()
mktree :: FilePath -> io ()
mktree FilePath
path = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Bool -> FilePath -> IO ()
Directory.createDirectoryIfMissing Bool
True FilePath
path)
cp :: MonadIO io => FilePath -> FilePath -> io ()
cp :: FilePath -> FilePath -> io ()
cp FilePath
oldPath FilePath
newPath = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> FilePath -> IO ()
Directory.copyFile FilePath
oldPath FilePath
newPath)
#if !defined(mingw32_HOST_OS)
symlink :: MonadIO io => FilePath -> FilePath -> io ()
symlink :: FilePath -> FilePath -> io ()
symlink FilePath
a FilePath
b = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> io ()) -> IO () -> io ()
forall a b. (a -> b) -> a -> b
$ FilePath -> FilePath -> IO ()
createSymbolicLink (ShowS
fp2fp FilePath
a) (ShowS
fp2fp FilePath
b)
where
fp2fp :: ShowS
fp2fp = Text -> FilePath
unpack (Text -> FilePath) -> (FilePath -> Text) -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Format Text (FilePath -> Text) -> FilePath -> Text
forall r. Format Text r -> r
format Format Text (FilePath -> Text)
forall r. Format r (FilePath -> r)
fp
#endif
isNotSymbolicLink :: MonadIO io => FilePath -> io Bool
isNotSymbolicLink :: FilePath -> io Bool
isNotSymbolicLink = (FileStatus -> Bool) -> io FileStatus -> io Bool
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (Bool -> Bool
not (Bool -> Bool) -> (FileStatus -> Bool) -> FileStatus -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FileStatus -> Bool
PosixCompat.isSymbolicLink) (io FileStatus -> io Bool)
-> (FilePath -> io FileStatus) -> FilePath -> io Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> io FileStatus
forall (io :: * -> *). MonadIO io => FilePath -> io FileStatus
lstat
cptree :: MonadIO io => FilePath -> FilePath -> io ()
cptree :: FilePath -> FilePath -> io ()
cptree FilePath
oldTree FilePath
newTree = Shell () -> io ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
FilePath
oldPath <- (FilePath -> IO Bool) -> FilePath -> Shell FilePath
lsif FilePath -> IO Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
isNotSymbolicLink FilePath
oldTree
Just FilePath
suffix <- Maybe FilePath -> Shell (Maybe FilePath)
forall (m :: * -> *) a. Monad m => a -> m a
return (FilePath -> FilePath -> Maybe FilePath
Internal.stripPrefix (FilePath
oldTree FilePath -> ShowS
forall a. Semigroup a => a -> a -> a
<> [ Char
FilePath.pathSeparator ]) FilePath
oldPath)
let newPath :: FilePath
newPath = FilePath
newTree FilePath -> ShowS
</> FilePath
suffix
Bool
isFile <- FilePath -> Shell Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testfile FilePath
oldPath
FileStatus
fileStatus <- FilePath -> Shell FileStatus
forall (io :: * -> *). MonadIO io => FilePath -> io FileStatus
lstat FilePath
oldPath
if FileStatus -> Bool
PosixCompat.isSymbolicLink FileStatus
fileStatus
then do
FilePath
oldTarget <- IO FilePath -> Shell FilePath
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO FilePath
PosixCompat.readSymbolicLink FilePath
oldPath)
FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
mktree (ShowS
FilePath.takeDirectory FilePath
newPath)
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> FilePath -> IO ()
PosixCompat.createSymbolicLink FilePath
oldTarget FilePath
newPath)
else if Bool
isFile
then do
FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
mktree (ShowS
FilePath.takeDirectory FilePath
newPath)
FilePath -> FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> FilePath -> io ()
cp FilePath
oldPath FilePath
newPath
else do
FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
mktree FilePath
newPath )
cptreeL :: MonadIO io => FilePath -> FilePath -> io ()
cptreeL :: FilePath -> FilePath -> io ()
cptreeL FilePath
oldTree FilePath
newTree = Shell () -> io ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
FilePath
oldPath <- FilePath -> Shell FilePath
lstree FilePath
oldTree
Just FilePath
suffix <- Maybe FilePath -> Shell (Maybe FilePath)
forall (m :: * -> *) a. Monad m => a -> m a
return (FilePath -> FilePath -> Maybe FilePath
Internal.stripPrefix (FilePath
oldTree FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
"/") FilePath
oldPath)
let newPath :: FilePath
newPath = FilePath
newTree FilePath -> ShowS
</> FilePath
suffix
Bool
isFile <- FilePath -> Shell Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testfile FilePath
oldPath
if Bool
isFile
then FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
mktree (ShowS
FilePath.takeDirectory FilePath
newPath) Shell () -> Shell () -> Shell ()
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> FilePath -> FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> FilePath -> io ()
cp FilePath
oldPath FilePath
newPath
else FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
mktree FilePath
newPath )
rm :: MonadIO io => FilePath -> io ()
rm :: FilePath -> io ()
rm FilePath
path = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO ()
Directory.removeFile FilePath
path)
rmdir :: MonadIO io => FilePath -> io ()
rmdir :: FilePath -> io ()
rmdir FilePath
path = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO ()
Directory.removeDirectory FilePath
path)
rmtree :: MonadIO io => FilePath -> io ()
rmtree :: FilePath -> io ()
rmtree FilePath
path0 = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Shell () -> IO ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (FilePath -> Shell ()
loop FilePath
path0))
where
loop :: FilePath -> Shell ()
loop FilePath
path = do
FileStatus
linkstat <- FilePath -> Shell FileStatus
forall (io :: * -> *). MonadIO io => FilePath -> io FileStatus
lstat FilePath
path
let isLink :: Bool
isLink = FileStatus -> Bool
PosixCompat.isSymbolicLink FileStatus
linkstat
isDir :: Bool
isDir = FileStatus -> Bool
PosixCompat.isDirectory FileStatus
linkstat
if Bool
isLink
then FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
rm FilePath
path
else do
if Bool
isDir
then (do
FilePath
child <- FilePath -> Shell FilePath
ls FilePath
path
FilePath -> Shell ()
loop FilePath
child ) Shell () -> Shell () -> Shell ()
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
rmdir FilePath
path
else FilePath -> Shell ()
forall (io :: * -> *). MonadIO io => FilePath -> io ()
rm FilePath
path
testfile :: MonadIO io => FilePath -> io Bool
testfile :: FilePath -> io Bool
testfile FilePath
path = IO Bool -> io Bool
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO Bool
Directory.doesFileExist FilePath
path)
testdir :: MonadIO io => FilePath -> io Bool
testdir :: FilePath -> io Bool
testdir FilePath
path = IO Bool -> io Bool
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO Bool
Directory.doesDirectoryExist FilePath
path)
testpath :: MonadIO io => FilePath -> io Bool
testpath :: FilePath -> io Bool
testpath FilePath
path = do
Bool
exists <- FilePath -> io Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testfile FilePath
path
if Bool
exists
then Bool -> io Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
exists
else FilePath -> io Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testdir FilePath
path
touch :: MonadIO io => FilePath -> io ()
touch :: FilePath -> io ()
touch FilePath
file = do
Bool
exists <- FilePath -> io Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testfile FilePath
file
IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (if Bool
exists
#ifdef mingw32_HOST_OS
then do
handle <- Win32.createFile
file
Win32.gENERIC_WRITE
Win32.fILE_SHARE_NONE
Nothing
Win32.oPEN_EXISTING
Win32.fILE_ATTRIBUTE_NORMAL
Nothing
(creationTime, _, _) <- Win32.getFileTime handle
systemTime <- Win32.getSystemTimeAsFileTime
Win32.setFileTime handle (Just creationTime) (Just systemTime) (Just systemTime)
#else
then FilePath -> IO ()
touchFile FilePath
file
#endif
else FilePath -> Shell Line -> IO ()
forall (io :: * -> *).
MonadIO io =>
FilePath -> Shell Line -> io ()
output FilePath
file Shell Line
forall (f :: * -> *) a. Alternative f => f a
empty )
data Permissions = Permissions
{ Permissions -> Bool
_readable :: Bool
, Permissions -> Bool
_writable :: Bool
, Permissions -> Bool
_executable :: Bool
} deriving (Permissions -> Permissions -> Bool
(Permissions -> Permissions -> Bool)
-> (Permissions -> Permissions -> Bool) -> Eq Permissions
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Permissions -> Permissions -> Bool
$c/= :: Permissions -> Permissions -> Bool
== :: Permissions -> Permissions -> Bool
$c== :: Permissions -> Permissions -> Bool
Eq, ReadPrec [Permissions]
ReadPrec Permissions
Int -> ReadS Permissions
ReadS [Permissions]
(Int -> ReadS Permissions)
-> ReadS [Permissions]
-> ReadPrec Permissions
-> ReadPrec [Permissions]
-> Read Permissions
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [Permissions]
$creadListPrec :: ReadPrec [Permissions]
readPrec :: ReadPrec Permissions
$creadPrec :: ReadPrec Permissions
readList :: ReadS [Permissions]
$creadList :: ReadS [Permissions]
readsPrec :: Int -> ReadS Permissions
$creadsPrec :: Int -> ReadS Permissions
Read, Eq Permissions
Eq Permissions
-> (Permissions -> Permissions -> Ordering)
-> (Permissions -> Permissions -> Bool)
-> (Permissions -> Permissions -> Bool)
-> (Permissions -> Permissions -> Bool)
-> (Permissions -> Permissions -> Bool)
-> (Permissions -> Permissions -> Permissions)
-> (Permissions -> Permissions -> Permissions)
-> Ord Permissions
Permissions -> Permissions -> Bool
Permissions -> Permissions -> Ordering
Permissions -> Permissions -> Permissions
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: Permissions -> Permissions -> Permissions
$cmin :: Permissions -> Permissions -> Permissions
max :: Permissions -> Permissions -> Permissions
$cmax :: Permissions -> Permissions -> Permissions
>= :: Permissions -> Permissions -> Bool
$c>= :: Permissions -> Permissions -> Bool
> :: Permissions -> Permissions -> Bool
$c> :: Permissions -> Permissions -> Bool
<= :: Permissions -> Permissions -> Bool
$c<= :: Permissions -> Permissions -> Bool
< :: Permissions -> Permissions -> Bool
$c< :: Permissions -> Permissions -> Bool
compare :: Permissions -> Permissions -> Ordering
$ccompare :: Permissions -> Permissions -> Ordering
$cp1Ord :: Eq Permissions
Ord, Int -> Permissions -> ShowS
[Permissions] -> ShowS
Permissions -> FilePath
(Int -> Permissions -> ShowS)
-> (Permissions -> FilePath)
-> ([Permissions] -> ShowS)
-> Show Permissions
forall a.
(Int -> a -> ShowS) -> (a -> FilePath) -> ([a] -> ShowS) -> Show a
showList :: [Permissions] -> ShowS
$cshowList :: [Permissions] -> ShowS
show :: Permissions -> FilePath
$cshow :: Permissions -> FilePath
showsPrec :: Int -> Permissions -> ShowS
$cshowsPrec :: Int -> Permissions -> ShowS
Show)
toSystemDirectoryPermissions :: Permissions -> Directory.Permissions
toSystemDirectoryPermissions :: Permissions -> Permissions
toSystemDirectoryPermissions Permissions
p =
( Bool -> Permissions -> Permissions
Directory.setOwnerReadable (Permissions -> Bool
_readable Permissions
p)
(Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Bool -> Permissions -> Permissions
Directory.setOwnerWritable (Permissions -> Bool
_writable Permissions
p)
(Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Bool -> Permissions -> Permissions
Directory.setOwnerExecutable (Permissions -> Bool
_executable Permissions
p)
) Permissions
Directory.emptyPermissions
fromSystemDirectoryPermissions :: Directory.Permissions -> Permissions
fromSystemDirectoryPermissions :: Permissions -> Permissions
fromSystemDirectoryPermissions Permissions
p = Permissions :: Bool -> Bool -> Bool -> Permissions
Permissions
{ _readable :: Bool
_readable = Permissions -> Bool
Directory.readable Permissions
p
, _writable :: Bool
_writable = Permissions -> Bool
Directory.writable Permissions
p
, _executable :: Bool
_executable =
Permissions -> Bool
Directory.executable Permissions
p Bool -> Bool -> Bool
|| Permissions -> Bool
Directory.searchable Permissions
p
}
chmod
:: MonadIO io
=> (Permissions -> Permissions)
-> FilePath
-> io Permissions
chmod :: (Permissions -> Permissions) -> FilePath -> io Permissions
chmod Permissions -> Permissions
modifyPermissions FilePath
path = IO Permissions -> io Permissions
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
let path' :: FilePath
path' = ShowS
deslash FilePath
path
Permissions
permissions <- FilePath -> IO Permissions
Directory.getPermissions FilePath
path'
let permissions' :: Permissions
permissions' = Permissions -> Permissions
fromSystemDirectoryPermissions Permissions
permissions
let permissions'' :: Permissions
permissions'' = Permissions -> Permissions
modifyPermissions Permissions
permissions'
changed :: Bool
changed = Permissions
permissions' Permissions -> Permissions -> Bool
forall a. Eq a => a -> a -> Bool
/= Permissions
permissions''
let permissions''' :: Permissions
permissions''' = Permissions -> Permissions
toSystemDirectoryPermissions Permissions
permissions''
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
changed (FilePath -> Permissions -> IO ()
Directory.setPermissions FilePath
path' Permissions
permissions''')
Permissions -> IO Permissions
forall (m :: * -> *) a. Monad m => a -> m a
return Permissions
permissions'' )
getmod :: MonadIO io => FilePath -> io Permissions
getmod :: FilePath -> io Permissions
getmod FilePath
path = IO Permissions -> io Permissions
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
let path' :: FilePath
path' = ShowS
deslash FilePath
path
Permissions
permissions <- FilePath -> IO Permissions
Directory.getPermissions FilePath
path'
Permissions -> IO Permissions
forall (m :: * -> *) a. Monad m => a -> m a
return (Permissions -> Permissions
fromSystemDirectoryPermissions Permissions
permissions))
setmod :: MonadIO io => Permissions -> FilePath -> io ()
setmod :: Permissions -> FilePath -> io ()
setmod Permissions
permissions FilePath
path = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
let path' :: FilePath
path' = ShowS
deslash FilePath
path
FilePath -> Permissions -> IO ()
Directory.setPermissions FilePath
path' (Permissions -> Permissions
toSystemDirectoryPermissions Permissions
permissions) )
copymod :: MonadIO io => FilePath -> FilePath -> io ()
copymod :: FilePath -> FilePath -> io ()
copymod FilePath
sourcePath FilePath
targetPath = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
let sourcePath' :: FilePath
sourcePath' = ShowS
deslash FilePath
sourcePath
targetPath' :: FilePath
targetPath' = ShowS
deslash FilePath
targetPath
FilePath -> FilePath -> IO ()
Directory.copyPermissions FilePath
sourcePath' FilePath
targetPath' )
readable :: Permissions -> Permissions
readable :: Permissions -> Permissions
readable Permissions
p = Permissions
p { _readable :: Bool
_readable = Bool
True }
nonreadable :: Permissions -> Permissions
nonreadable :: Permissions -> Permissions
nonreadable Permissions
p = Permissions
p { _readable :: Bool
_readable = Bool
False }
writable :: Permissions -> Permissions
writable :: Permissions -> Permissions
writable Permissions
p = Permissions
p { _writable :: Bool
_writable = Bool
True }
nonwritable :: Permissions -> Permissions
nonwritable :: Permissions -> Permissions
nonwritable Permissions
p = Permissions
p { _writable :: Bool
_writable = Bool
False }
executable :: Permissions -> Permissions
executable :: Permissions -> Permissions
executable Permissions
p = Permissions
p { _executable :: Bool
_executable = Bool
True }
nonexecutable :: Permissions -> Permissions
nonexecutable :: Permissions -> Permissions
nonexecutable Permissions
p = Permissions
p { _executable :: Bool
_executable = Bool
False }
ooo :: Permissions -> Permissions
ooo :: Permissions -> Permissions
ooo Permissions
_ = Permissions :: Bool -> Bool -> Bool -> Permissions
Permissions
{ _readable :: Bool
_readable = Bool
False
, _writable :: Bool
_writable = Bool
False
, _executable :: Bool
_executable = Bool
False
}
roo :: Permissions -> Permissions
roo :: Permissions -> Permissions
roo = Permissions -> Permissions
readable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
ooo
owo :: Permissions -> Permissions
owo :: Permissions -> Permissions
owo = Permissions -> Permissions
writable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
ooo
oox :: Permissions -> Permissions
oox :: Permissions -> Permissions
oox = Permissions -> Permissions
executable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
ooo
rwo :: Permissions -> Permissions
rwo :: Permissions -> Permissions
rwo = Permissions -> Permissions
readable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
writable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
ooo
rox :: Permissions -> Permissions
rox :: Permissions -> Permissions
rox = Permissions -> Permissions
readable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
executable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
ooo
owx :: Permissions -> Permissions
owx :: Permissions -> Permissions
owx = Permissions -> Permissions
writable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
executable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
ooo
rwx :: Permissions -> Permissions
rwx :: Permissions -> Permissions
rwx = Permissions -> Permissions
readable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
writable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
executable (Permissions -> Permissions)
-> (Permissions -> Permissions) -> Permissions -> Permissions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Permissions -> Permissions
ooo
time :: MonadIO io => io a -> io (a, NominalDiffTime)
time :: io a -> io (a, NominalDiffTime)
time io a
io = do
TimeSpec Int64
seconds1 Int64
nanoseconds1 <- IO TimeSpec -> io TimeSpec
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Clock -> IO TimeSpec
getTime Clock
Monotonic)
a
a <- io a
io
TimeSpec Int64
seconds2 Int64
nanoseconds2 <- IO TimeSpec -> io TimeSpec
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Clock -> IO TimeSpec
getTime Clock
Monotonic)
let t :: Rational
t = Int64 -> Rational
forall a b. (Integral a, Num b) => a -> b
fromIntegral ( Int64
seconds2 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
- Int64
seconds1)
Rational -> Rational -> Rational
forall a. Num a => a -> a -> a
+ Int64 -> Rational
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int64
nanoseconds2 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
- Int64
nanoseconds1) Rational -> Rational -> Rational
forall a. Fractional a => a -> a -> a
/ Rational
10Rational -> Int -> Rational
forall a b. (Num a, Integral b) => a -> b -> a
^(Int
9::Int)
(a, NominalDiffTime) -> io (a, NominalDiffTime)
forall (m :: * -> *) a. Monad m => a -> m a
return (a
a, Rational -> NominalDiffTime
forall a. Fractional a => Rational -> a
fromRational Rational
t)
hostname :: MonadIO io => io Text
hostname :: io Text
hostname = IO Text -> io Text
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO ((FilePath -> Text) -> IO FilePath -> IO Text
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap FilePath -> Text
Text.pack IO FilePath
getHostName)
which :: MonadIO io => FilePath -> io (Maybe FilePath)
which :: FilePath -> io (Maybe FilePath)
which FilePath
cmd = Shell FilePath
-> Fold FilePath (Maybe FilePath) -> io (Maybe FilePath)
forall (io :: * -> *) a b.
MonadIO io =>
Shell a -> Fold a b -> io b
fold (FilePath -> Shell FilePath
whichAll FilePath
cmd) Fold FilePath (Maybe FilePath)
forall a. Fold a (Maybe a)
Control.Foldl.head
whichAll :: FilePath -> Shell FilePath
whichAll :: FilePath -> Shell FilePath
whichAll FilePath
cmd = do
Just Text
paths <- Text -> Shell (Maybe Text)
forall (io :: * -> *). MonadIO io => Text -> io (Maybe Text)
need Text
"PATH"
FilePath
path <- [FilePath] -> Shell FilePath
forall (f :: * -> *) a. Foldable f => f a -> Shell a
select ((Text -> FilePath) -> [Text] -> [FilePath]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap Text -> FilePath
Text.unpack (Text -> Text -> [Text]
Text.splitOn Text
":" Text
paths))
let path' :: FilePath
path' = FilePath
path FilePath -> ShowS
</> FilePath
cmd
Bool
True <- FilePath -> Shell Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testfile FilePath
path'
let handler :: IOError -> IO Bool
handler :: IOError -> IO Bool
handler IOError
e =
if IOError -> Bool
isPermissionError IOError
e Bool -> Bool -> Bool
|| IOError -> Bool
isDoesNotExistError IOError
e
then Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
False
else IOError -> IO Bool
forall e a. Exception e => e -> IO a
throwIO IOError
e
let getIsExecutable :: IO Bool
getIsExecutable = (Permissions -> Bool) -> IO Permissions -> IO Bool
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap Permissions -> Bool
_executable (FilePath -> IO Permissions
forall (io :: * -> *). MonadIO io => FilePath -> io Permissions
getmod FilePath
path')
Bool
isExecutable <- IO Bool -> Shell Bool
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool
getIsExecutable IO Bool -> (IOError -> IO Bool) -> IO Bool
forall a. IO a -> (IOError -> IO a) -> IO a
`catchIOError` IOError -> IO Bool
handler)
Bool -> Shell ()
forall (f :: * -> *). Alternative f => Bool -> f ()
guard Bool
isExecutable
FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
path'
sleep :: MonadIO io => NominalDiffTime -> io ()
sleep :: NominalDiffTime -> io ()
sleep NominalDiffTime
n = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Int -> IO ()
threadDelay (NominalDiffTime -> Int
forall a b. (RealFrac a, Integral b) => a -> b
truncate (NominalDiffTime
n NominalDiffTime -> NominalDiffTime -> NominalDiffTime
forall a. Num a => a -> a -> a
* NominalDiffTime
10NominalDiffTime -> Int -> NominalDiffTime
forall a b. (Num a, Integral b) => a -> b -> a
^(Int
6::Int))))
exit :: MonadIO io => ExitCode -> io a
exit :: ExitCode -> io a
exit ExitCode
code = IO a -> io a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (ExitCode -> IO a
forall a. ExitCode -> IO a
exitWith ExitCode
code)
die :: MonadIO io => Text -> io a
die :: Text -> io a
die Text
txt = IO a -> io a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IOError -> IO a
forall e a. Exception e => e -> IO a
throwIO (FilePath -> IOError
userError (Text -> FilePath
unpack Text
txt)))
infixr 2 .||.
infixr 3 .&&.
(.&&.) :: Monad m => m ExitCode -> m ExitCode -> m ExitCode
m ExitCode
cmd1 .&&. :: m ExitCode -> m ExitCode -> m ExitCode
.&&. m ExitCode
cmd2 = do
ExitCode
r <- m ExitCode
cmd1
case ExitCode
r of
ExitCode
ExitSuccess -> m ExitCode
cmd2
ExitCode
_ -> ExitCode -> m ExitCode
forall (m :: * -> *) a. Monad m => a -> m a
return ExitCode
r
(.||.) :: Monad m => m ExitCode -> m ExitCode -> m ExitCode
m ExitCode
cmd1 .||. :: m ExitCode -> m ExitCode -> m ExitCode
.||. m ExitCode
cmd2 = do
ExitCode
r <- m ExitCode
cmd1
case ExitCode
r of
ExitFailure Int
_ -> m ExitCode
cmd2
ExitCode
_ -> ExitCode -> m ExitCode
forall (m :: * -> *) a. Monad m => a -> m a
return ExitCode
r
mktempdir
:: MonadManaged managed
=> FilePath
-> Text
-> managed FilePath
mktempdir :: FilePath -> Text -> managed FilePath
mktempdir FilePath
parent Text
prefix = Managed FilePath -> managed FilePath
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using (do
let prefix' :: FilePath
prefix' = Text -> FilePath
unpack Text
prefix
(forall r. (FilePath -> IO r) -> IO r) -> Managed FilePath
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (FilePath -> FilePath -> (FilePath -> IO r) -> IO r
forall (m :: * -> *) a.
(MonadMask m, MonadIO m) =>
FilePath -> FilePath -> (FilePath -> m a) -> m a
withTempDirectory FilePath
parent FilePath
prefix'))
mktemp
:: MonadManaged managed
=> FilePath
-> Text
-> managed (FilePath, Handle)
mktemp :: FilePath -> Text -> managed (FilePath, Handle)
mktemp FilePath
parent Text
prefix = Managed (FilePath, Handle) -> managed (FilePath, Handle)
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using (do
let prefix' :: FilePath
prefix' = Text -> FilePath
unpack Text
prefix
(FilePath
file', Handle
handle) <- (forall r. ((FilePath, Handle) -> IO r) -> IO r)
-> Managed (FilePath, Handle)
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (\(FilePath, Handle) -> IO r
k ->
FilePath -> FilePath -> (FilePath -> Handle -> IO r) -> IO r
forall (m :: * -> *) a.
(MonadIO m, MonadMask m) =>
FilePath -> FilePath -> (FilePath -> Handle -> m a) -> m a
withTempFile FilePath
parent FilePath
prefix' (\FilePath
file' Handle
handle -> (FilePath, Handle) -> IO r
k (FilePath
file', Handle
handle)) )
(FilePath, Handle) -> Managed (FilePath, Handle)
forall (m :: * -> *) a. Monad m => a -> m a
return (FilePath
file', Handle
handle) )
mktempfile
:: MonadManaged managed
=> FilePath
-> Text
-> managed FilePath
mktempfile :: FilePath -> Text -> managed FilePath
mktempfile FilePath
parent Text
prefix = Managed FilePath -> managed FilePath
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using (do
let prefix' :: FilePath
prefix' = Text -> FilePath
unpack Text
prefix
(FilePath
file', Handle
handle) <- (forall r. ((FilePath, Handle) -> IO r) -> IO r)
-> Managed (FilePath, Handle)
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (\(FilePath, Handle) -> IO r
k ->
FilePath -> FilePath -> (FilePath -> Handle -> IO r) -> IO r
forall (m :: * -> *) a.
(MonadIO m, MonadMask m) =>
FilePath -> FilePath -> (FilePath -> Handle -> m a) -> m a
withTempFile FilePath
parent FilePath
prefix' (\FilePath
file' Handle
handle -> (FilePath, Handle) -> IO r
k (FilePath
file', Handle
handle)) )
IO () -> Managed ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Handle -> IO ()
hClose Handle
handle)
FilePath -> Managed FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
file' )
fork :: MonadManaged managed => IO a -> managed (Async a)
fork :: IO a -> managed (Async a)
fork IO a
io = Managed (Async a) -> managed (Async a)
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using ((forall r. (Async a -> IO r) -> IO r) -> Managed (Async a)
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (IO a -> (Async a -> IO r) -> IO r
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync IO a
io))
wait :: MonadIO io => Async a -> io a
wait :: Async a -> io a
wait Async a
a = IO a -> io a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Async a -> IO a
forall a. Async a -> IO a
Control.Concurrent.Async.wait Async a
a)
stdin :: Shell Line
stdin :: Shell Line
stdin = Handle -> Shell Line
inhandle Handle
IO.stdin
input :: FilePath -> Shell Line
input :: FilePath -> Shell Line
input FilePath
file = do
Handle
handle <- Managed Handle -> Shell Handle
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using (FilePath -> Managed Handle
forall (managed :: * -> *).
MonadManaged managed =>
FilePath -> managed Handle
readonly FilePath
file)
Handle -> Shell Line
inhandle Handle
handle
inhandle :: Handle -> Shell Line
inhandle :: Handle -> Shell Line
inhandle Handle
handle = (forall r. FoldShell Line r -> IO r) -> Shell Line
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell (\(FoldShell x -> Line -> IO x
step x
begin x -> IO r
done) -> do
let loop :: x -> IO r
loop x
x = do
Bool
eof <- Handle -> IO Bool
IO.hIsEOF Handle
handle
if Bool
eof
then x -> IO r
done x
x
else do
Text
txt <- Handle -> IO Text
Text.hGetLine Handle
handle
x
x' <- x -> Line -> IO x
step x
x (Text -> Line
unsafeTextToLine Text
txt)
x -> IO r
loop (x -> IO r) -> x -> IO r
forall a b. (a -> b) -> a -> b
$! x
x'
x -> IO r
loop (x -> IO r) -> x -> IO r
forall a b. (a -> b) -> a -> b
$! x
begin )
stdout :: MonadIO io => Shell Line -> io ()
stdout :: Shell Line -> io ()
stdout Shell Line
s = Shell () -> io ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
Line
line <- Shell Line
s
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Line -> IO ()
forall (io :: * -> *). MonadIO io => Line -> io ()
echo Line
line) )
output :: MonadIO io => FilePath -> Shell Line -> io ()
output :: FilePath -> Shell Line -> io ()
output FilePath
file Shell Line
s = Shell () -> io ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
Handle
handle <- Managed Handle -> Shell Handle
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using (FilePath -> Managed Handle
forall (managed :: * -> *).
MonadManaged managed =>
FilePath -> managed Handle
writeonly FilePath
file)
Line
line <- Shell Line
s
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Handle -> Text -> IO ()
Text.hPutStrLn Handle
handle (Line -> Text
lineToText Line
line)) )
outhandle :: MonadIO io => Handle -> Shell Line -> io ()
outhandle :: Handle -> Shell Line -> io ()
outhandle Handle
handle Shell Line
s = Shell () -> io ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
Line
line <- Shell Line
s
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Handle -> Text -> IO ()
Text.hPutStrLn Handle
handle (Line -> Text
lineToText Line
line)) )
append :: MonadIO io => FilePath -> Shell Line -> io ()
append :: FilePath -> Shell Line -> io ()
append FilePath
file Shell Line
s = Shell () -> io ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
Handle
handle <- Managed Handle -> Shell Handle
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using (FilePath -> Managed Handle
forall (managed :: * -> *).
MonadManaged managed =>
FilePath -> managed Handle
appendonly FilePath
file)
Line
line <- Shell Line
s
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Handle -> Text -> IO ()
Text.hPutStrLn Handle
handle (Line -> Text
lineToText Line
line)) )
stderr :: MonadIO io => Shell Line -> io ()
stderr :: Shell Line -> io ()
stderr Shell Line
s = Shell () -> io ()
forall (io :: * -> *) a. MonadIO io => Shell a -> io ()
sh (do
Line
line <- Shell Line
s
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Line -> IO ()
forall (io :: * -> *). MonadIO io => Line -> io ()
err Line
line) )
strict :: MonadIO io => Shell Line -> io Text
strict :: Shell Line -> io Text
strict Shell Line
s = ([Line] -> Text) -> io [Line] -> io Text
forall (m :: * -> *) a1 r. Monad m => (a1 -> r) -> m a1 -> m r
liftM [Line] -> Text
linesToText (Shell Line -> Fold Line [Line] -> io [Line]
forall (io :: * -> *) a b.
MonadIO io =>
Shell a -> Fold a b -> io b
fold Shell Line
s Fold Line [Line]
forall a. Fold a [a]
list)
readonly :: MonadManaged managed => FilePath -> managed Handle
readonly :: FilePath -> managed Handle
readonly FilePath
file = Managed Handle -> managed Handle
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using ((forall r. (Handle -> IO r) -> IO r) -> Managed Handle
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (FilePath -> IOMode -> (Handle -> IO r) -> IO r
forall r. FilePath -> IOMode -> (Handle -> IO r) -> IO r
IO.withFile FilePath
file IOMode
IO.ReadMode))
writeonly :: MonadManaged managed => FilePath -> managed Handle
writeonly :: FilePath -> managed Handle
writeonly FilePath
file = Managed Handle -> managed Handle
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using ((forall r. (Handle -> IO r) -> IO r) -> Managed Handle
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (FilePath -> IOMode -> (Handle -> IO r) -> IO r
forall r. FilePath -> IOMode -> (Handle -> IO r) -> IO r
IO.withFile FilePath
file IOMode
IO.WriteMode))
appendonly :: MonadManaged managed => FilePath -> managed Handle
appendonly :: FilePath -> managed Handle
appendonly FilePath
file = Managed Handle -> managed Handle
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using ((forall r. (Handle -> IO r) -> IO r) -> Managed Handle
forall (m :: * -> *) a.
MonadManaged m =>
(forall r. (a -> IO r) -> IO r) -> m a
managed (FilePath -> IOMode -> (Handle -> IO r) -> IO r
forall r. FilePath -> IOMode -> (Handle -> IO r) -> IO r
IO.withFile FilePath
file IOMode
IO.AppendMode))
cat :: [Shell a] -> Shell a
cat :: [Shell a] -> Shell a
cat = [Shell a] -> Shell a
forall (t :: * -> *) (m :: * -> *) a.
(Foldable t, MonadPlus m) =>
t (m a) -> m a
msum
grepWith :: (b -> Text) -> Pattern a -> Shell b -> Shell b
grepWith :: (b -> Text) -> Pattern a -> Shell b -> Shell b
grepWith b -> Text
f Pattern a
pattern' = (b -> Bool) -> Shell b -> Shell b
forall (m :: * -> *) a. MonadPlus m => (a -> Bool) -> m a -> m a
mfilter (Bool -> Bool
not (Bool -> Bool) -> (b -> Bool) -> b -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null ([a] -> Bool) -> (b -> [a]) -> b -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Pattern a -> Text -> [a]
forall a. Pattern a -> Text -> [a]
match Pattern a
pattern' (Text -> [a]) -> (b -> Text) -> b -> [a]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. b -> Text
f)
grep :: Pattern a -> Shell Line -> Shell Line
grep :: Pattern a -> Shell Line -> Shell Line
grep = (Line -> Text) -> Pattern a -> Shell Line -> Shell Line
forall b a. (b -> Text) -> Pattern a -> Shell b -> Shell b
grepWith Line -> Text
lineToText
grepText :: Pattern a -> Shell Text -> Shell Text
grepText :: Pattern a -> Shell Text -> Shell Text
grepText = (Text -> Text) -> Pattern a -> Shell Text -> Shell Text
forall b a. (b -> Text) -> Pattern a -> Shell b -> Shell b
grepWith Text -> Text
forall a. a -> a
id
sed :: Pattern Text -> Shell Line -> Shell Line
sed :: Pattern Text -> Shell Line -> Shell Line
sed Pattern Text
pattern' Shell Line
s = do
Bool -> Shell () -> Shell ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (Pattern Text -> Bool
forall a. Pattern a -> Bool
matchesEmpty Pattern Text
pattern') (Text -> Shell ()
forall (io :: * -> *) a. MonadIO io => Text -> io a
die Text
message)
let pattern'' :: Pattern Text
pattern'' = ([Text] -> Text) -> Pattern [Text] -> Pattern Text
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap [Text] -> Text
Text.concat
(Pattern Text -> Pattern [Text]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (Pattern Text
pattern' Pattern Text -> Pattern Text -> Pattern Text
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Char -> Text) -> Pattern Char -> Pattern Text
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap Char -> Text
Text.singleton Pattern Char
anyChar))
Line
line <- Shell Line
s
Text
txt':[Text]
_ <- [Text] -> Shell [Text]
forall (m :: * -> *) a. Monad m => a -> m a
return (Pattern Text -> Text -> [Text]
forall a. Pattern a -> Text -> [a]
match Pattern Text
pattern'' (Line -> Text
lineToText Line
line))
NonEmpty Line -> Shell Line
forall (f :: * -> *) a. Foldable f => f a -> Shell a
select (Text -> NonEmpty Line
textToLines Text
txt')
where
message :: Text
message = Text
"sed: the given pattern matches the empty string"
matchesEmpty :: Pattern a -> Bool
matchesEmpty = Bool -> Bool
not (Bool -> Bool) -> (Pattern a -> Bool) -> Pattern a -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null ([a] -> Bool) -> (Pattern a -> [a]) -> Pattern a -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Pattern a -> Text -> [a]) -> Text -> Pattern a -> [a]
forall a b c. (a -> b -> c) -> b -> a -> c
flip Pattern a -> Text -> [a]
forall a. Pattern a -> Text -> [a]
match Text
""
sedPrefix :: Pattern Text -> Shell Line -> Shell Line
sedPrefix :: Pattern Text -> Shell Line -> Shell Line
sedPrefix Pattern Text
pattern' Shell Line
s = do
Line
line <- Shell Line
s
Text
txt':[Text]
_ <- [Text] -> Shell [Text]
forall (m :: * -> *) a. Monad m => a -> m a
return (Pattern Text -> Text -> [Text]
forall a. Pattern a -> Text -> [a]
match ((Pattern Text
pattern' Pattern Text -> Pattern Text -> Pattern Text
forall a. Semigroup a => a -> a -> a
<> Pattern Text
chars) Pattern Text -> Pattern Text -> Pattern Text
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Pattern Text
chars) (Line -> Text
lineToText Line
line))
NonEmpty Line -> Shell Line
forall (f :: * -> *) a. Foldable f => f a -> Shell a
select (Text -> NonEmpty Line
textToLines Text
txt')
sedSuffix :: Pattern Text -> Shell Line -> Shell Line
sedSuffix :: Pattern Text -> Shell Line -> Shell Line
sedSuffix Pattern Text
pattern' Shell Line
s = do
Line
line <- Shell Line
s
Text
txt':[Text]
_ <- [Text] -> Shell [Text]
forall (m :: * -> *) a. Monad m => a -> m a
return (Pattern Text -> Text -> [Text]
forall a. Pattern a -> Text -> [a]
match ((Pattern Text
chars Pattern Text -> Pattern Text -> Pattern Text
forall a. Semigroup a => a -> a -> a
<> Pattern Text
pattern') Pattern Text -> Pattern Text -> Pattern Text
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Pattern Text
chars) (Line -> Text
lineToText Line
line))
NonEmpty Line -> Shell Line
forall (f :: * -> *) a. Foldable f => f a -> Shell a
select (Text -> NonEmpty Line
textToLines Text
txt')
sedEntire :: Pattern Text -> Shell Line -> Shell Line
sedEntire :: Pattern Text -> Shell Line -> Shell Line
sedEntire Pattern Text
pattern' Shell Line
s = do
Line
line <- Shell Line
s
Text
txt':[Text]
_ <- [Text] -> Shell [Text]
forall (m :: * -> *) a. Monad m => a -> m a
return (Pattern Text -> Text -> [Text]
forall a. Pattern a -> Text -> [a]
match (Pattern Text
pattern' Pattern Text -> Pattern Text -> Pattern Text
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Pattern Text
chars)(Line -> Text
lineToText Line
line))
NonEmpty Line -> Shell Line
forall (f :: * -> *) a. Foldable f => f a -> Shell a
select (Text -> NonEmpty Line
textToLines Text
txt')
onFiles :: (Shell Text -> Shell Text) -> Shell FilePath -> Shell FilePath
onFiles :: (Shell Text -> Shell Text) -> Shell FilePath -> Shell FilePath
onFiles Shell Text -> Shell Text
f = (Text -> FilePath) -> Shell Text -> Shell FilePath
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap Text -> FilePath
Text.unpack (Shell Text -> Shell FilePath)
-> (Shell FilePath -> Shell Text)
-> Shell FilePath
-> Shell FilePath
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Shell Text -> Shell Text
f (Shell Text -> Shell Text)
-> (Shell FilePath -> Shell Text) -> Shell FilePath -> Shell Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (FilePath -> Text) -> Shell FilePath -> Shell Text
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap FilePath -> Text
Text.pack
inplace :: MonadIO io => Pattern Text -> FilePath -> io ()
inplace :: Pattern Text -> FilePath -> io ()
inplace = (Shell Line -> Shell Line) -> FilePath -> io ()
forall (io :: * -> *).
MonadIO io =>
(Shell Line -> Shell Line) -> FilePath -> io ()
update ((Shell Line -> Shell Line) -> FilePath -> io ())
-> (Pattern Text -> Shell Line -> Shell Line)
-> Pattern Text
-> FilePath
-> io ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Pattern Text -> Shell Line -> Shell Line
sed
inplacePrefix :: MonadIO io => Pattern Text -> FilePath -> io ()
inplacePrefix :: Pattern Text -> FilePath -> io ()
inplacePrefix = (Shell Line -> Shell Line) -> FilePath -> io ()
forall (io :: * -> *).
MonadIO io =>
(Shell Line -> Shell Line) -> FilePath -> io ()
update ((Shell Line -> Shell Line) -> FilePath -> io ())
-> (Pattern Text -> Shell Line -> Shell Line)
-> Pattern Text
-> FilePath
-> io ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Pattern Text -> Shell Line -> Shell Line
sedPrefix
inplaceSuffix :: MonadIO io => Pattern Text -> FilePath -> io ()
inplaceSuffix :: Pattern Text -> FilePath -> io ()
inplaceSuffix = (Shell Line -> Shell Line) -> FilePath -> io ()
forall (io :: * -> *).
MonadIO io =>
(Shell Line -> Shell Line) -> FilePath -> io ()
update ((Shell Line -> Shell Line) -> FilePath -> io ())
-> (Pattern Text -> Shell Line -> Shell Line)
-> Pattern Text
-> FilePath
-> io ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Pattern Text -> Shell Line -> Shell Line
sedSuffix
inplaceEntire :: MonadIO io => Pattern Text -> FilePath -> io ()
inplaceEntire :: Pattern Text -> FilePath -> io ()
inplaceEntire = (Shell Line -> Shell Line) -> FilePath -> io ()
forall (io :: * -> *).
MonadIO io =>
(Shell Line -> Shell Line) -> FilePath -> io ()
update ((Shell Line -> Shell Line) -> FilePath -> io ())
-> (Pattern Text -> Shell Line -> Shell Line)
-> Pattern Text
-> FilePath
-> io ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Pattern Text -> Shell Line -> Shell Line
sedEntire
update :: MonadIO io => (Shell Line -> Shell Line) -> FilePath -> io ()
update :: (Shell Line -> Shell Line) -> FilePath -> io ()
update Shell Line -> Shell Line
f FilePath
file = IO () -> io ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Managed () -> IO ()
runManaged (do
FilePath
here <- Managed FilePath
forall (io :: * -> *). MonadIO io => io FilePath
pwd
(FilePath
tmpfile, Handle
handle) <- FilePath -> Text -> Managed (FilePath, Handle)
forall (managed :: * -> *).
MonadManaged managed =>
FilePath -> Text -> managed (FilePath, Handle)
mktemp FilePath
here Text
"turtle"
Handle -> Shell Line -> Managed ()
forall (io :: * -> *). MonadIO io => Handle -> Shell Line -> io ()
outhandle Handle
handle (Shell Line -> Shell Line
f (FilePath -> Shell Line
input FilePath
file))
IO () -> Managed ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Handle -> IO ()
hClose Handle
handle)
FilePath -> FilePath -> Managed ()
forall (io :: * -> *). MonadIO io => FilePath -> FilePath -> io ()
copymod FilePath
file FilePath
tmpfile
FilePath -> FilePath -> Managed ()
forall (io :: * -> *). MonadIO io => FilePath -> FilePath -> io ()
mv FilePath
tmpfile FilePath
file ))
find :: Pattern a -> FilePath -> Shell FilePath
find :: Pattern a -> FilePath -> Shell FilePath
find Pattern a
pattern' FilePath
dir = do
FilePath
path <- (FilePath -> IO Bool) -> FilePath -> Shell FilePath
lsif FilePath -> IO Bool
isNotSymlink FilePath
dir
let txt :: Text
txt = FilePath -> Text
Text.pack FilePath
path
a
_:[a]
_ <- [a] -> Shell [a]
forall (m :: * -> *) a. Monad m => a -> m a
return (Pattern a -> Text -> [a]
forall a. Pattern a -> Text -> [a]
match Pattern a
pattern' Text
txt)
FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
path
where
isNotSymlink :: FilePath -> IO Bool
isNotSymlink :: FilePath -> IO Bool
isNotSymlink FilePath
file = do
FileStatus
file_stat <- FilePath -> IO FileStatus
forall (io :: * -> *). MonadIO io => FilePath -> io FileStatus
lstat FilePath
file
Bool -> IO Bool
forall (m :: * -> *) a. Monad m => a -> m a
return (Bool -> Bool
not (FileStatus -> Bool
PosixCompat.isSymbolicLink FileStatus
file_stat))
findtree :: Pattern a -> Shell FilePath -> Shell FilePath
findtree :: Pattern a -> Shell FilePath -> Shell FilePath
findtree Pattern a
pat Shell FilePath
files = do
FilePath
path <- Shell FilePath
files
let txt :: Text
txt = FilePath -> Text
Text.pack FilePath
path
a
_:[a]
_ <- [a] -> Shell [a]
forall (m :: * -> *) a. Monad m => a -> m a
return (Pattern a -> Text -> [a]
forall a. Pattern a -> Text -> [a]
match Pattern a
pat Text
txt)
FilePath -> Shell FilePath
forall (m :: * -> *) a. Monad m => a -> m a
return FilePath
path
cmin :: MonadIO io => UTCTime -> FilePath -> io Bool
cmin :: UTCTime -> FilePath -> io Bool
cmin UTCTime
t FilePath
file = do
FileStatus
status <- FilePath -> io FileStatus
forall (io :: * -> *). MonadIO io => FilePath -> io FileStatus
lstat FilePath
file
Bool -> io Bool
forall (m :: * -> *) a. Monad m => a -> m a
return (FileStatus -> Bool
adapt FileStatus
status)
where
adapt :: FileStatus -> Bool
adapt FileStatus
x = NominalDiffTime -> UTCTime
posixSecondsToUTCTime (FileStatus -> NominalDiffTime
modificationTime FileStatus
x) UTCTime -> UTCTime -> Bool
forall a. Ord a => a -> a -> Bool
> UTCTime
t
cmax :: MonadIO io => UTCTime -> FilePath -> io Bool
cmax :: UTCTime -> FilePath -> io Bool
cmax UTCTime
t FilePath
file = do
FileStatus
status <- FilePath -> io FileStatus
forall (io :: * -> *). MonadIO io => FilePath -> io FileStatus
lstat FilePath
file
Bool -> io Bool
forall (m :: * -> *) a. Monad m => a -> m a
return (FileStatus -> Bool
adapt FileStatus
status)
where
adapt :: FileStatus -> Bool
adapt FileStatus
x = NominalDiffTime -> UTCTime
posixSecondsToUTCTime (FileStatus -> NominalDiffTime
modificationTime FileStatus
x) UTCTime -> UTCTime -> Bool
forall a. Ord a => a -> a -> Bool
< UTCTime
t
yes :: Shell Line
yes :: Shell Line
yes = (() -> Line) -> Shell () -> Shell Line
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (\()
_ -> Line
"y") Shell ()
endless
nl :: Num n => Shell a -> Shell (n, a)
nl :: Shell a -> Shell (n, a)
nl Shell a
s = (forall r. FoldShell (n, a) r -> IO r) -> Shell (n, a)
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell forall r. FoldShell (n, a) r -> IO r
forall b b. Num b => FoldShell (b, a) b -> IO b
_foldShell'
where
_foldShell' :: FoldShell (b, a) b -> IO b
_foldShell' (FoldShell x -> (b, a) -> IO x
step x
begin x -> IO b
done) = Shell a -> FoldShell a b -> IO b
forall a. Shell a -> forall r. FoldShell a r -> IO r
_foldShell Shell a
s (((x, b) -> a -> IO (x, b))
-> (x, b) -> ((x, b) -> IO b) -> FoldShell a b
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell (x, b) -> a -> IO (x, b)
step' (x, b)
begin' (x, b) -> IO b
forall b. (x, b) -> IO b
done')
where
step' :: (x, b) -> a -> IO (x, b)
step' (x
x, b
n) a
a = do
x
x' <- x -> (b, a) -> IO x
step x
x (b
n, a
a)
let n' :: b
n' = b
n b -> b -> b
forall a. Num a => a -> a -> a
+ b
1
b
n' b -> IO (x, b) -> IO (x, b)
`seq` (x, b) -> IO (x, b)
forall (m :: * -> *) a. Monad m => a -> m a
return (x
x', b
n')
begin' :: (x, b)
begin' = (x
begin, b
0)
done' :: (x, b) -> IO b
done' (x
x, b
_) = x -> IO b
done x
x
data ZipState a b = Empty | HasA a | HasAB a b | Done
paste :: Shell a -> Shell b -> Shell (a, b)
paste :: Shell a -> Shell b -> Shell (a, b)
paste Shell a
sA Shell b
sB = (forall r. FoldShell (a, b) r -> IO r) -> Shell (a, b)
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell forall r. FoldShell (a, b) r -> IO r
_foldShellAB
where
_foldShellAB :: FoldShell (a, b) b -> IO b
_foldShellAB (FoldShell x -> (a, b) -> IO x
stepAB x
beginAB x -> IO b
doneAB) = do
TVar (ZipState a b)
tvar <- STM (TVar (ZipState a b)) -> IO (TVar (ZipState a b))
forall a. STM a -> IO a
STM.atomically (ZipState a b -> STM (TVar (ZipState a b))
forall a. a -> STM (TVar a)
STM.newTVar ZipState a b
forall a b. ZipState a b
Empty)
let begin :: ()
begin = ()
let stepA :: () -> a -> IO ()
stepA () a
a = STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (do
ZipState a b
x <- TVar (ZipState a b) -> STM (ZipState a b)
forall a. TVar a -> STM a
STM.readTVar TVar (ZipState a b)
tvar
case ZipState a b
x of
ZipState a b
Empty -> TVar (ZipState a b) -> ZipState a b -> STM ()
forall a. TVar a -> a -> STM ()
STM.writeTVar TVar (ZipState a b)
tvar (a -> ZipState a b
forall a b. a -> ZipState a b
HasA a
a)
ZipState a b
Done -> () -> STM ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
ZipState a b
_ -> STM ()
forall a. STM a
STM.retry )
let doneA :: () -> IO ()
doneA () = STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (do
ZipState a b
x <- TVar (ZipState a b) -> STM (ZipState a b)
forall a. TVar a -> STM a
STM.readTVar TVar (ZipState a b)
tvar
case ZipState a b
x of
ZipState a b
Empty -> TVar (ZipState a b) -> ZipState a b -> STM ()
forall a. TVar a -> a -> STM ()
STM.writeTVar TVar (ZipState a b)
tvar ZipState a b
forall a b. ZipState a b
Done
ZipState a b
Done -> () -> STM ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
ZipState a b
_ -> STM ()
forall a. STM a
STM.retry )
let foldA :: FoldShell a ()
foldA = (() -> a -> IO ()) -> () -> (() -> IO ()) -> FoldShell a ()
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell () -> a -> IO ()
stepA ()
begin () -> IO ()
doneA
let stepB :: () -> b -> IO ()
stepB () b
b = STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (do
ZipState a b
x <- TVar (ZipState a b) -> STM (ZipState a b)
forall a. TVar a -> STM a
STM.readTVar TVar (ZipState a b)
tvar
case ZipState a b
x of
HasA a
a -> TVar (ZipState a b) -> ZipState a b -> STM ()
forall a. TVar a -> a -> STM ()
STM.writeTVar TVar (ZipState a b)
tvar (a -> b -> ZipState a b
forall a b. a -> b -> ZipState a b
HasAB a
a b
b)
ZipState a b
Done -> () -> STM ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
ZipState a b
_ -> STM ()
forall a. STM a
STM.retry )
let doneB :: () -> IO ()
doneB () = STM () -> IO ()
forall a. STM a -> IO a
STM.atomically (do
ZipState a b
x <- TVar (ZipState a b) -> STM (ZipState a b)
forall a. TVar a -> STM a
STM.readTVar TVar (ZipState a b)
tvar
case ZipState a b
x of
HasA a
_ -> TVar (ZipState a b) -> ZipState a b -> STM ()
forall a. TVar a -> a -> STM ()
STM.writeTVar TVar (ZipState a b)
tvar ZipState a b
forall a b. ZipState a b
Done
ZipState a b
Done -> () -> STM ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
ZipState a b
_ -> STM ()
forall a. STM a
STM.retry )
let foldB :: FoldShell b ()
foldB = (() -> b -> IO ()) -> () -> (() -> IO ()) -> FoldShell b ()
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell () -> b -> IO ()
stepB ()
begin () -> IO ()
doneB
IO () -> (Async () -> IO b) -> IO b
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync (Shell a -> FoldShell a () -> IO ()
forall a. Shell a -> forall r. FoldShell a r -> IO r
_foldShell Shell a
sA FoldShell a ()
foldA) (\Async ()
asyncA -> do
IO () -> (Async () -> IO b) -> IO b
forall a b. IO a -> (Async a -> IO b) -> IO b
withAsync (Shell b -> FoldShell b () -> IO ()
forall a. Shell a -> forall r. FoldShell a r -> IO r
_foldShell Shell b
sB FoldShell b ()
foldB) (\Async ()
asyncB -> do
let loop :: x -> IO x
loop x
x = do
Maybe (a, b)
y <- STM (Maybe (a, b)) -> IO (Maybe (a, b))
forall a. STM a -> IO a
STM.atomically (do
ZipState a b
z <- TVar (ZipState a b) -> STM (ZipState a b)
forall a. TVar a -> STM a
STM.readTVar TVar (ZipState a b)
tvar
case ZipState a b
z of
HasAB a
a b
b -> do
TVar (ZipState a b) -> ZipState a b -> STM ()
forall a. TVar a -> a -> STM ()
STM.writeTVar TVar (ZipState a b)
tvar ZipState a b
forall a b. ZipState a b
Empty
Maybe (a, b) -> STM (Maybe (a, b))
forall (m :: * -> *) a. Monad m => a -> m a
return ((a, b) -> Maybe (a, b)
forall a. a -> Maybe a
Just (a
a, b
b))
ZipState a b
Done -> Maybe (a, b) -> STM (Maybe (a, b))
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe (a, b)
forall a. Maybe a
Nothing
ZipState a b
_ -> STM (Maybe (a, b))
forall a. STM a
STM.retry )
case Maybe (a, b)
y of
Maybe (a, b)
Nothing -> x -> IO x
forall (m :: * -> *) a. Monad m => a -> m a
return x
x
Just (a, b)
ab -> do
x
x' <- x -> (a, b) -> IO x
stepAB x
x (a, b)
ab
x -> IO x
loop (x -> IO x) -> x -> IO x
forall a b. (a -> b) -> a -> b
$! x
x'
x
x' <- x -> IO x
loop (x -> IO x) -> x -> IO x
forall a b. (a -> b) -> a -> b
$! x
beginAB
Async () -> IO ()
forall (io :: * -> *) a. MonadIO io => Async a -> io a
wait Async ()
asyncA
Async () -> IO ()
forall (io :: * -> *) a. MonadIO io => Async a -> io a
wait Async ()
asyncB
x -> IO b
doneAB x
x' ) )
endless :: Shell ()
endless :: Shell ()
endless = (forall r. FoldShell () r -> IO r) -> Shell ()
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell (\(FoldShell x -> () -> IO x
step x
begin x -> IO r
_) -> do
let loop :: x -> IO b
loop x
x = do
x
x' <- x -> () -> IO x
step x
x ()
x -> IO b
loop (x -> IO b) -> x -> IO b
forall a b. (a -> b) -> a -> b
$! x
x'
x -> IO r
forall b. x -> IO b
loop (x -> IO r) -> x -> IO r
forall a b. (a -> b) -> a -> b
$! x
begin )
limit :: Int -> Shell a -> Shell a
limit :: Int -> Shell a -> Shell a
limit Int
n Shell a
s = (forall r. FoldShell a r -> IO r) -> Shell a
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell (\(FoldShell x -> a -> IO x
step x
begin x -> IO r
done) -> do
IORef Int
ref <- Int -> IO (IORef Int)
forall a. a -> IO (IORef a)
newIORef Int
0
let step' :: x -> a -> IO x
step' x
x a
a = do
Int
n' <- IORef Int -> IO Int
forall a. IORef a -> IO a
readIORef IORef Int
ref
IORef Int -> Int -> IO ()
forall a. IORef a -> a -> IO ()
writeIORef IORef Int
ref (Int
n' Int -> Int -> Int
forall a. Num a => a -> a -> a
+ Int
1)
if Int
n' Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
< Int
n then x -> a -> IO x
step x
x a
a else x -> IO x
forall (m :: * -> *) a. Monad m => a -> m a
return x
x
Shell a -> FoldShell a r -> IO r
forall a. Shell a -> forall r. FoldShell a r -> IO r
_foldShell Shell a
s ((x -> a -> IO x) -> x -> (x -> IO r) -> FoldShell a r
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell x -> a -> IO x
step' x
begin x -> IO r
done) )
limitWhile :: (a -> Bool) -> Shell a -> Shell a
limitWhile :: (a -> Bool) -> Shell a -> Shell a
limitWhile a -> Bool
predicate Shell a
s = (forall r. FoldShell a r -> IO r) -> Shell a
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell (\(FoldShell x -> a -> IO x
step x
begin x -> IO r
done) -> do
IORef Bool
ref <- Bool -> IO (IORef Bool)
forall a. a -> IO (IORef a)
newIORef Bool
True
let step' :: x -> a -> IO x
step' x
x a
a = do
Bool
b <- IORef Bool -> IO Bool
forall a. IORef a -> IO a
readIORef IORef Bool
ref
let b' :: Bool
b' = Bool
b Bool -> Bool -> Bool
&& a -> Bool
predicate a
a
IORef Bool -> Bool -> IO ()
forall a. IORef a -> a -> IO ()
writeIORef IORef Bool
ref Bool
b'
if Bool
b' then x -> a -> IO x
step x
x a
a else x -> IO x
forall (m :: * -> *) a. Monad m => a -> m a
return x
x
Shell a -> FoldShell a r -> IO r
forall a. Shell a -> forall r. FoldShell a r -> IO r
_foldShell Shell a
s ((x -> a -> IO x) -> x -> (x -> IO r) -> FoldShell a r
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell x -> a -> IO x
step' x
begin x -> IO r
done) )
cache :: (Read a, Show a) => FilePath -> Shell a -> Shell a
cache :: FilePath -> Shell a -> Shell a
cache FilePath
file Shell a
s = do
let cached :: Shell (Maybe a)
cached = do
Line
line <- FilePath -> Shell Line
input FilePath
file
case ReadS (Maybe a)
forall a. Read a => ReadS a
reads (Text -> FilePath
Text.unpack (Line -> Text
lineToText Line
line)) of
[(Maybe a
ma, FilePath
"")] -> Maybe a -> Shell (Maybe a)
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe a
ma
[(Maybe a, FilePath)]
_ ->
Text -> Shell (Maybe a)
forall (io :: * -> *) a. MonadIO io => Text -> io a
die (Format Text (FilePath -> Text) -> FilePath -> Text
forall r. Format Text r -> r
format (Format (FilePath -> Text) (FilePath -> Text)
"cache: Invalid data stored in "Format (FilePath -> Text) (FilePath -> Text)
-> Format Text (FilePath -> Text) -> Format Text (FilePath -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text (FilePath -> Text)
forall a r. Show a => Format r (a -> r)
w) FilePath
file)
Bool
exists <- FilePath -> Shell Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testfile FilePath
file
[Maybe a]
mas <- Shell (Maybe a) -> Fold (Maybe a) [Maybe a] -> Shell [Maybe a]
forall (io :: * -> *) a b.
MonadIO io =>
Shell a -> Fold a b -> io b
fold (if Bool
exists then Shell (Maybe a)
cached else Shell (Maybe a)
forall (f :: * -> *) a. Alternative f => f a
empty) Fold (Maybe a) [Maybe a]
forall a. Fold a [a]
list
case [ () | Maybe a
Nothing <- [Maybe a]
mas ] of
()
_:[()]
_ -> [a] -> Shell a
forall (f :: * -> *) a. Foldable f => f a -> Shell a
select [ a
a | Just a
a <- [Maybe a]
mas ]
[()]
_ -> do
Handle
handle <- Managed Handle -> Shell Handle
forall (m :: * -> *) a. MonadManaged m => Managed a -> m a
using (FilePath -> Managed Handle
forall (managed :: * -> *).
MonadManaged managed =>
FilePath -> managed Handle
writeonly FilePath
file)
let justs :: Shell a
justs = do
a
a <- Shell a
s
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Handle -> Text -> IO ()
Text.hPutStrLn Handle
handle (FilePath -> Text
Text.pack (Maybe a -> FilePath
forall a. Show a => a -> FilePath
show (a -> Maybe a
forall a. a -> Maybe a
Just a
a))))
a -> Shell a
forall (m :: * -> *) a. Monad m => a -> m a
return a
a
let nothing :: Shell b
nothing = do
let n :: Maybe ()
n = Maybe ()
forall a. Maybe a
Nothing :: Maybe ()
IO () -> Shell ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (Handle -> Text -> IO ()
Text.hPutStrLn Handle
handle (FilePath -> Text
Text.pack (Maybe () -> FilePath
forall a. Show a => a -> FilePath
show Maybe ()
n)))
Shell b
forall (f :: * -> *) a. Alternative f => f a
empty
Shell a
justs Shell a -> Shell a -> Shell a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Shell a
forall b. Shell b
nothing
parallel :: [IO a] -> Shell a
parallel :: [IO a] -> Shell a
parallel = (IO a -> Shell (Async a)) -> [IO a] -> Shell [Async a]
forall (t :: * -> *) (f :: * -> *) a b.
(Traversable t, Applicative f) =>
(a -> f b) -> t a -> f (t b)
traverse IO a -> Shell (Async a)
forall (managed :: * -> *) a.
MonadManaged managed =>
IO a -> managed (Async a)
fork ([IO a] -> Shell [Async a])
-> ([Async a] -> Shell a) -> [IO a] -> Shell a
forall (m :: * -> *) a b c.
Monad m =>
(a -> m b) -> (b -> m c) -> a -> m c
>=> [Async a] -> Shell (Async a)
forall (f :: * -> *) a. Foldable f => f a -> Shell a
select ([Async a] -> Shell (Async a))
-> (Async a -> Shell a) -> [Async a] -> Shell a
forall (m :: * -> *) a b c.
Monad m =>
(a -> m b) -> (b -> m c) -> a -> m c
>=> Async a -> Shell a
forall (io :: * -> *) a. MonadIO io => Async a -> io a
wait
cut :: Pattern a -> Text -> [Text]
cut :: Pattern a -> Text -> [Text]
cut Pattern a
pattern' Text
txt = [[Text]] -> [Text]
forall a. [a] -> a
head (Pattern [Text] -> Text -> [[Text]]
forall a. Pattern a -> Text -> [a]
match (Pattern Text -> Pattern Text
forall a. Pattern a -> Pattern a
selfless Pattern Text
chars Pattern Text -> Pattern a -> Pattern [Text]
forall a b. Pattern a -> Pattern b -> Pattern [a]
`sepBy` Pattern a
pattern') Text
txt)
date :: MonadIO io => io UTCTime
date :: io UTCTime
date = IO UTCTime -> io UTCTime
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO IO UTCTime
getCurrentTime
datefile :: MonadIO io => FilePath -> io UTCTime
datefile :: FilePath -> io UTCTime
datefile FilePath
path = IO UTCTime -> io UTCTime
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO UTCTime
Directory.getModificationTime FilePath
path)
du :: MonadIO io => FilePath -> io Size
du :: FilePath -> io Size
du FilePath
path = IO Size -> io Size
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (do
Bool
isDir <- FilePath -> IO Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testdir FilePath
path
Integer
size <- do
if Bool
isDir
then do
let sizes :: Shell Integer
sizes = do
FilePath
child <- FilePath -> Shell FilePath
lstree FilePath
path
Bool
True <- FilePath -> Shell Bool
forall (io :: * -> *). MonadIO io => FilePath -> io Bool
testfile FilePath
child
IO Integer -> Shell Integer
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (FilePath -> IO Integer
Directory.getFileSize FilePath
child)
Shell Integer -> Fold Integer Integer -> IO Integer
forall (io :: * -> *) a b.
MonadIO io =>
Shell a -> Fold a b -> io b
fold Shell Integer
sizes Fold Integer Integer
forall a. Num a => Fold a a
Control.Foldl.sum
else FilePath -> IO Integer
Directory.getFileSize FilePath
path
Size -> IO Size
forall (m :: * -> *) a. Monad m => a -> m a
return (Integer -> Size
Size Integer
size) )
newtype Size = Size { Size -> Integer
_bytes :: Integer } deriving (Size -> Size -> Bool
(Size -> Size -> Bool) -> (Size -> Size -> Bool) -> Eq Size
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Size -> Size -> Bool
$c/= :: Size -> Size -> Bool
== :: Size -> Size -> Bool
$c== :: Size -> Size -> Bool
Eq, Eq Size
Eq Size
-> (Size -> Size -> Ordering)
-> (Size -> Size -> Bool)
-> (Size -> Size -> Bool)
-> (Size -> Size -> Bool)
-> (Size -> Size -> Bool)
-> (Size -> Size -> Size)
-> (Size -> Size -> Size)
-> Ord Size
Size -> Size -> Bool
Size -> Size -> Ordering
Size -> Size -> Size
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: Size -> Size -> Size
$cmin :: Size -> Size -> Size
max :: Size -> Size -> Size
$cmax :: Size -> Size -> Size
>= :: Size -> Size -> Bool
$c>= :: Size -> Size -> Bool
> :: Size -> Size -> Bool
$c> :: Size -> Size -> Bool
<= :: Size -> Size -> Bool
$c<= :: Size -> Size -> Bool
< :: Size -> Size -> Bool
$c< :: Size -> Size -> Bool
compare :: Size -> Size -> Ordering
$ccompare :: Size -> Size -> Ordering
$cp1Ord :: Eq Size
Ord, Integer -> Size
Size -> Size
Size -> Size -> Size
(Size -> Size -> Size)
-> (Size -> Size -> Size)
-> (Size -> Size -> Size)
-> (Size -> Size)
-> (Size -> Size)
-> (Size -> Size)
-> (Integer -> Size)
-> Num Size
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
fromInteger :: Integer -> Size
$cfromInteger :: Integer -> Size
signum :: Size -> Size
$csignum :: Size -> Size
abs :: Size -> Size
$cabs :: Size -> Size
negate :: Size -> Size
$cnegate :: Size -> Size
* :: Size -> Size -> Size
$c* :: Size -> Size -> Size
- :: Size -> Size -> Size
$c- :: Size -> Size -> Size
+ :: Size -> Size -> Size
$c+ :: Size -> Size -> Size
Num)
instance Show Size where
show :: Size -> FilePath
show = Integer -> FilePath
forall a. Show a => a -> FilePath
show (Integer -> FilePath) -> (Size -> Integer) -> Size -> FilePath
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Size -> Integer
_bytes
sz :: Format r (Size -> r)
sz :: Format r (Size -> r)
sz = (Size -> Text) -> Format r (Size -> r)
forall a r. (a -> Text) -> Format r (a -> r)
makeFormat (\(Size Integer
numBytes) ->
let (Integer
numKilobytes, Integer
remainingBytes ) = Integer
numBytes Integer -> Integer -> (Integer, Integer)
forall a. Integral a => a -> a -> (a, a)
`quotRem` Integer
1000
(Integer
numMegabytes, Integer
remainingKilobytes) = Integer
numKilobytes Integer -> Integer -> (Integer, Integer)
forall a. Integral a => a -> a -> (a, a)
`quotRem` Integer
1000
(Integer
numGigabytes, Integer
remainingMegabytes) = Integer
numMegabytes Integer -> Integer -> (Integer, Integer)
forall a. Integral a => a -> a -> (a, a)
`quotRem` Integer
1000
(Integer
numTerabytes, Integer
remainingGigabytes) = Integer
numGigabytes Integer -> Integer -> (Integer, Integer)
forall a. Integral a => a -> a -> (a, a)
`quotRem` Integer
1000
in if Integer
numKilobytes Integer -> Integer -> Bool
forall a. Ord a => a -> a -> Bool
<= Integer
0
then Format Text (Integer -> Text) -> Integer -> Text
forall r. Format Text r -> r
format (Format Text (Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat Text (Integer -> Text)
-> Format Text Text -> Format Text (Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text Text
" B" ) Integer
remainingBytes
else if Integer
numMegabytes Integer -> Integer -> Bool
forall a. Eq a => a -> a -> Bool
== Integer
0
then Format Text (Integer -> Integer -> Text)
-> Integer -> Integer -> Text
forall r. Format Text r -> r
format (Format (Integer -> Text) (Integer -> Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat (Integer -> Text) (Integer -> Integer -> Text)
-> Format (Integer -> Text) (Integer -> Text)
-> Format (Integer -> Text) (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format (Integer -> Text) (Integer -> Text)
"."Format (Integer -> Text) (Integer -> Integer -> Text)
-> Format Text (Integer -> Text)
-> Format Text (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text (Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat Text (Integer -> Integer -> Text)
-> Format Text Text -> Format Text (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text Text
" KB") Integer
remainingKilobytes Integer
remainingBytes
else if Integer
numGigabytes Integer -> Integer -> Bool
forall a. Eq a => a -> a -> Bool
== Integer
0
then Format Text (Integer -> Integer -> Text)
-> Integer -> Integer -> Text
forall r. Format Text r -> r
format (Format (Integer -> Text) (Integer -> Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat (Integer -> Text) (Integer -> Integer -> Text)
-> Format (Integer -> Text) (Integer -> Text)
-> Format (Integer -> Text) (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format (Integer -> Text) (Integer -> Text)
"."Format (Integer -> Text) (Integer -> Integer -> Text)
-> Format Text (Integer -> Text)
-> Format Text (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text (Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat Text (Integer -> Integer -> Text)
-> Format Text Text -> Format Text (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text Text
" MB") Integer
remainingMegabytes Integer
remainingKilobytes
else if Integer
numTerabytes Integer -> Integer -> Bool
forall a. Eq a => a -> a -> Bool
== Integer
0
then Format Text (Integer -> Integer -> Text)
-> Integer -> Integer -> Text
forall r. Format Text r -> r
format (Format (Integer -> Text) (Integer -> Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat (Integer -> Text) (Integer -> Integer -> Text)
-> Format (Integer -> Text) (Integer -> Text)
-> Format (Integer -> Text) (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format (Integer -> Text) (Integer -> Text)
"."Format (Integer -> Text) (Integer -> Integer -> Text)
-> Format Text (Integer -> Text)
-> Format Text (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text (Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat Text (Integer -> Integer -> Text)
-> Format Text Text -> Format Text (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text Text
" GB") Integer
remainingGigabytes Integer
remainingMegabytes
else Format Text (Integer -> Integer -> Text)
-> Integer -> Integer -> Text
forall r. Format Text r -> r
format (Format (Integer -> Text) (Integer -> Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat (Integer -> Text) (Integer -> Integer -> Text)
-> Format (Integer -> Text) (Integer -> Text)
-> Format (Integer -> Text) (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format (Integer -> Text) (Integer -> Text)
"."Format (Integer -> Text) (Integer -> Integer -> Text)
-> Format Text (Integer -> Text)
-> Format Text (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text (Integer -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat Text (Integer -> Integer -> Text)
-> Format Text Text -> Format Text (Integer -> Integer -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text Text
" TB") Integer
numTerabytes Integer
remainingGigabytes )
pattern B :: Integral n => n -> Size
pattern $bB :: n -> Size
$mB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
B { Size -> Integral n => n
bytes } <- (fromInteger . _bytes -> bytes)
where
B = n -> Size
forall a b. (Integral a, Num b) => a -> b
fromIntegral
{-# COMPLETE B #-}
pattern KB :: Integral n => n -> Size
pattern $bKB :: n -> Size
$mKB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
KB { Size -> Integral n => n
kilobytes } <- (\(B x) -> x `div` 1000 -> kilobytes)
where
KB = n -> Size
forall n. Integral n => n -> Size
B (n -> Size) -> (n -> n) -> n -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (n -> n -> n
forall a. Num a => a -> a -> a
* n
1000)
{-# COMPLETE KB #-}
pattern MB :: Integral n => n -> Size
pattern $bMB :: n -> Size
$mMB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
MB { Size -> Integral n => n
megabytes } <- (\(KB x) -> x `div` 1000 -> megabytes)
where
MB = n -> Size
forall n. Integral n => n -> Size
KB (n -> Size) -> (n -> n) -> n -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (n -> n -> n
forall a. Num a => a -> a -> a
* n
1000)
{-# COMPLETE MB #-}
pattern GB :: Integral n => n -> Size
pattern $bGB :: n -> Size
$mGB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
GB { Size -> Integral n => n
gigabytes } <- (\(MB x) -> x `div` 1000 -> gigabytes)
where
GB = n -> Size
forall n. Integral n => n -> Size
MB (n -> Size) -> (n -> n) -> n -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (n -> n -> n
forall a. Num a => a -> a -> a
* n
1000)
{-# COMPLETE GB #-}
pattern TB :: Integral n => n -> Size
pattern $bTB :: n -> Size
$mTB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
TB { Size -> Integral n => n
terabytes } <- (\(GB x) -> x `div` 1000 -> terabytes)
where
TB = n -> Size
forall n. Integral n => n -> Size
GB (n -> Size) -> (n -> n) -> n -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (n -> n -> n
forall a. Num a => a -> a -> a
* n
1000)
{-# COMPLETE TB #-}
pattern KiB :: Integral n => n -> Size
pattern $bKiB :: n -> Size
$mKiB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
KiB { Size -> Integral n => n
kibibytes } <- (\(B x) -> x `div` 1024 -> kibibytes)
where
KiB = n -> Size
forall n. Integral n => n -> Size
B (n -> Size) -> (n -> n) -> n -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (n -> n -> n
forall a. Num a => a -> a -> a
* n
1024)
{-# COMPLETE KiB #-}
pattern MiB :: Integral n => n -> Size
pattern $bMiB :: n -> Size
$mMiB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
MiB { Size -> Integral n => n
mebibytes } <- (\(KiB x) -> x `div` 1024 -> mebibytes)
where
MiB = n -> Size
forall n. Integral n => n -> Size
KiB (n -> Size) -> (n -> n) -> n -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (n -> n -> n
forall a. Num a => a -> a -> a
* n
1024)
{-# COMPLETE MiB #-}
pattern GiB :: Integral n => n -> Size
pattern $bGiB :: n -> Size
$mGiB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
GiB { Size -> Integral n => n
gibibytes } <- (\(MiB x) -> x `div` 1024 -> gibibytes)
where
GiB = n -> Size
forall n. Integral n => n -> Size
MiB (n -> Size) -> (n -> n) -> n -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (n -> n -> n
forall a. Num a => a -> a -> a
* n
1024)
{-# COMPLETE GiB #-}
pattern TiB :: Integral n => n -> Size
pattern $bTiB :: n -> Size
$mTiB :: forall r n. Integral n => Size -> (n -> r) -> (Void# -> r) -> r
TiB { Size -> Integral n => n
tebibytes } <- (\(GiB x) -> x `div` 1024 -> tebibytes)
where
TiB = n -> Size
forall n. Integral n => n -> Size
GiB (n -> Size) -> (n -> n) -> n -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (n -> n -> n
forall a. Num a => a -> a -> a
* n
1024)
{-# COMPLETE TiB #-}
bytes :: Integral n => Size -> n
kilobytes :: Integral n => Size -> n
megabytes :: Integral n => Size -> n
gigabytes :: Integral n => Size -> n
terabytes :: Integral n => Size -> n
kibibytes :: Integral n => Size -> n
mebibytes :: Integral n => Size -> n
gibibytes :: Integral n => Size -> n
tebibytes :: Integral n => Size -> n
countChars :: Integral n => Fold Line n
countChars :: Fold Line n
countChars =
(Line -> Text) -> Fold Text n -> Fold Line n
forall a b r. (a -> b) -> Fold b r -> Fold a r
premap Line -> Text
lineToText Fold Text n
forall n. Num n => Fold Text n
Control.Foldl.Text.length Fold Line n -> Fold Line n -> Fold Line n
forall a. Num a => a -> a -> a
+
Fold Line n
forall a. Num a => a
charsPerNewline Fold Line n -> Fold Line n -> Fold Line n
forall a. Num a => a -> a -> a
* Fold Line n
forall n. Integral n => Fold Line n
countLines
charsPerNewline :: Num a => a
#ifdef mingw32_HOST_OS
charsPerNewline = 2
#else
charsPerNewline :: a
charsPerNewline = a
1
#endif
countWords :: Integral n => Fold Line n
countWords :: Fold Line n
countWords = (Line -> [Text]) -> Fold [Text] n -> Fold Line n
forall a b r. (a -> b) -> Fold b r -> Fold a r
premap (Text -> [Text]
Text.words (Text -> [Text]) -> (Line -> Text) -> Line -> [Text]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Line -> Text
lineToText) (Handler [Text] Text -> Fold Text n -> Fold [Text] n
forall a b r. Handler a b -> Fold b r -> Fold a r
handles Handler [Text] Text
forall (t :: * -> *) (f :: * -> *) a b.
(Traversable t, Applicative f) =>
(a -> f b) -> t a -> f (t b)
traverse Fold Text n
forall b a. Num b => Fold a b
genericLength)
countLines :: Integral n => Fold Line n
countLines :: Fold Line n
countLines = Fold Line n
forall b a. Num b => Fold a b
genericLength
stat :: MonadIO io => FilePath -> io PosixCompat.FileStatus
stat :: FilePath -> io FileStatus
stat = IO FileStatus -> io FileStatus
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO FileStatus -> io FileStatus)
-> (FilePath -> IO FileStatus) -> FilePath -> io FileStatus
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> IO FileStatus
PosixCompat.getFileStatus
fileSize :: PosixCompat.FileStatus -> Size
fileSize :: FileStatus -> Size
fileSize = FileOffset -> Size
forall a b. (Integral a, Num b) => a -> b
fromIntegral (FileOffset -> Size)
-> (FileStatus -> FileOffset) -> FileStatus -> Size
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FileStatus -> FileOffset
PosixCompat.fileSize
accessTime :: PosixCompat.FileStatus -> POSIXTime
accessTime :: FileStatus -> NominalDiffTime
accessTime = EpochTime -> NominalDiffTime
forall a b. (Real a, Fractional b) => a -> b
realToFrac (EpochTime -> NominalDiffTime)
-> (FileStatus -> EpochTime) -> FileStatus -> NominalDiffTime
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FileStatus -> EpochTime
PosixCompat.accessTime
modificationTime :: PosixCompat.FileStatus -> POSIXTime
modificationTime :: FileStatus -> NominalDiffTime
modificationTime = EpochTime -> NominalDiffTime
forall a b. (Real a, Fractional b) => a -> b
realToFrac (EpochTime -> NominalDiffTime)
-> (FileStatus -> EpochTime) -> FileStatus -> NominalDiffTime
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FileStatus -> EpochTime
PosixCompat.modificationTime
statusChangeTime :: PosixCompat.FileStatus -> POSIXTime
statusChangeTime :: FileStatus -> NominalDiffTime
statusChangeTime = EpochTime -> NominalDiffTime
forall a b. (Real a, Fractional b) => a -> b
realToFrac (EpochTime -> NominalDiffTime)
-> (FileStatus -> EpochTime) -> FileStatus -> NominalDiffTime
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FileStatus -> EpochTime
PosixCompat.statusChangeTime
lstat :: MonadIO io => FilePath -> io PosixCompat.FileStatus
lstat :: FilePath -> io FileStatus
lstat = IO FileStatus -> io FileStatus
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO FileStatus -> io FileStatus)
-> (FilePath -> IO FileStatus) -> FilePath -> io FileStatus
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> IO FileStatus
PosixCompat.getSymbolicLinkStatus
data a
= a
| Row a a
deriving (Int -> WithHeader a -> ShowS
[WithHeader a] -> ShowS
WithHeader a -> FilePath
(Int -> WithHeader a -> ShowS)
-> (WithHeader a -> FilePath)
-> ([WithHeader a] -> ShowS)
-> Show (WithHeader a)
forall a. Show a => Int -> WithHeader a -> ShowS
forall a. Show a => [WithHeader a] -> ShowS
forall a. Show a => WithHeader a -> FilePath
forall a.
(Int -> a -> ShowS) -> (a -> FilePath) -> ([a] -> ShowS) -> Show a
showList :: [WithHeader a] -> ShowS
$cshowList :: forall a. Show a => [WithHeader a] -> ShowS
show :: WithHeader a -> FilePath
$cshow :: forall a. Show a => WithHeader a -> FilePath
showsPrec :: Int -> WithHeader a -> ShowS
$cshowsPrec :: forall a. Show a => Int -> WithHeader a -> ShowS
Show)
data Pair a b = Pair !a !b
header :: Shell a -> Shell (WithHeader a)
(Shell forall r. FoldShell a r -> IO r
k) = (forall r. FoldShell (WithHeader a) r -> IO r)
-> Shell (WithHeader a)
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell forall r. FoldShell (WithHeader a) r -> IO r
k'
where
k' :: FoldShell (WithHeader a) b -> IO b
k' (FoldShell x -> WithHeader a -> IO x
step x
begin x -> IO b
done) = FoldShell a b -> IO b
forall r. FoldShell a r -> IO r
k ((Pair x (Maybe a) -> a -> IO (Pair x (Maybe a)))
-> Pair x (Maybe a) -> (Pair x (Maybe a) -> IO b) -> FoldShell a b
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell Pair x (Maybe a) -> a -> IO (Pair x (Maybe a))
step' Pair x (Maybe a)
forall a. Pair x (Maybe a)
begin' Pair x (Maybe a) -> IO b
forall b. Pair x b -> IO b
done')
where
step' :: Pair x (Maybe a) -> a -> IO (Pair x (Maybe a))
step' (Pair x
x Maybe a
Nothing ) a
a = do
x
x' <- x -> WithHeader a -> IO x
step x
x (a -> WithHeader a
forall a. a -> WithHeader a
Header a
a)
Pair x (Maybe a) -> IO (Pair x (Maybe a))
forall (m :: * -> *) a. Monad m => a -> m a
return (x -> Maybe a -> Pair x (Maybe a)
forall a b. a -> b -> Pair a b
Pair x
x' (a -> Maybe a
forall a. a -> Maybe a
Just a
a))
step' (Pair x
x (Just a
a)) a
b = do
x
x' <- x -> WithHeader a -> IO x
step x
x (a -> a -> WithHeader a
forall a. a -> a -> WithHeader a
Row a
a a
b)
Pair x (Maybe a) -> IO (Pair x (Maybe a))
forall (m :: * -> *) a. Monad m => a -> m a
return (x -> Maybe a -> Pair x (Maybe a)
forall a b. a -> b -> Pair a b
Pair x
x' (a -> Maybe a
forall a. a -> Maybe a
Just a
a))
begin' :: Pair x (Maybe a)
begin' = x -> Maybe a -> Pair x (Maybe a)
forall a b. a -> b -> Pair a b
Pair x
begin Maybe a
forall a. Maybe a
Nothing
done' :: Pair x b -> IO b
done' (Pair x
x b
_) = x -> IO b
done x
x
single :: MonadIO io => Shell a -> io a
single :: Shell a -> io a
single Shell a
s = do
[a]
as <- Shell a -> Fold a [a] -> io [a]
forall (io :: * -> *) a b.
MonadIO io =>
Shell a -> Fold a b -> io b
fold Shell a
s Fold a [a]
forall a. Fold a [a]
Control.Foldl.list
case [a]
as of
[a
a] -> a -> io a
forall (m :: * -> *) a. Monad m => a -> m a
return a
a
[a]
_ -> do
let msg :: Text
msg = Format Text (Int -> Text) -> Int -> Text
forall r. Format Text r -> r
format (Format (Int -> Text) (Int -> Text)
"single: expected 1 line of input but there were "Format (Int -> Text) (Int -> Text)
-> Format Text (Int -> Text) -> Format Text (Int -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text (Int -> Text)
forall n r. Integral n => Format r (n -> r)
dFormat Text (Int -> Text)
-> Format Text Text -> Format Text (Int -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text Text
" lines of input") ([a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length [a]
as)
Text -> io a
forall (io :: * -> *) a. MonadIO io => Text -> io a
die Text
msg
uniq :: Eq a => Shell a -> Shell a
uniq :: Shell a -> Shell a
uniq = (a -> a) -> Shell a -> Shell a
forall b a. Eq b => (a -> b) -> Shell a -> Shell a
uniqOn a -> a
forall a. a -> a
id
uniqOn :: Eq b => (a -> b) -> Shell a -> Shell a
uniqOn :: (a -> b) -> Shell a -> Shell a
uniqOn a -> b
f = (a -> a -> Bool) -> Shell a -> Shell a
forall a. (a -> a -> Bool) -> Shell a -> Shell a
uniqBy (\a
a a
a' -> a -> b
f a
a b -> b -> Bool
forall a. Eq a => a -> a -> Bool
== a -> b
f a
a')
uniqBy :: (a -> a -> Bool) -> Shell a -> Shell a
uniqBy :: (a -> a -> Bool) -> Shell a -> Shell a
uniqBy a -> a -> Bool
cmp Shell a
s = (forall r. FoldShell a r -> IO r) -> Shell a
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell ((forall r. FoldShell a r -> IO r) -> Shell a)
-> (forall r. FoldShell a r -> IO r) -> Shell a
forall a b. (a -> b) -> a -> b
$ \(FoldShell x -> a -> IO x
step x
begin x -> IO r
done) -> do
let step' :: (x, Maybe a) -> a -> IO (x, Maybe a)
step' (x
x, Just a
a') a
a | a -> a -> Bool
cmp a
a a
a' = (x, Maybe a) -> IO (x, Maybe a)
forall (m :: * -> *) a. Monad m => a -> m a
return (x
x, a -> Maybe a
forall a. a -> Maybe a
Just a
a)
step' (x
x, Maybe a
_) a
a = (, a -> Maybe a
forall a. a -> Maybe a
Just a
a) (x -> (x, Maybe a)) -> IO x -> IO (x, Maybe a)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> x -> a -> IO x
step x
x a
a
begin' :: (x, Maybe a)
begin' = (x
begin, Maybe a
forall a. Maybe a
Nothing)
done' :: (x, b) -> IO r
done' (x
x, b
_) = x -> IO r
done x
x
Shell a -> FoldShell a r -> IO r
forall (io :: * -> *) a b.
MonadIO io =>
Shell a -> FoldShell a b -> io b
foldShell Shell a
s (((x, Maybe a) -> a -> IO (x, Maybe a))
-> (x, Maybe a) -> ((x, Maybe a) -> IO r) -> FoldShell a r
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell (x, Maybe a) -> a -> IO (x, Maybe a)
step' (x, Maybe a)
forall a. (x, Maybe a)
begin' (x, Maybe a) -> IO r
forall b. (x, b) -> IO r
done')
nub :: Ord a => Shell a -> Shell a
nub :: Shell a -> Shell a
nub = (a -> a) -> Shell a -> Shell a
forall b a. Ord b => (a -> b) -> Shell a -> Shell a
nubOn a -> a
forall a. a -> a
id
nubOn :: Ord b => (a -> b) -> Shell a -> Shell a
nubOn :: (a -> b) -> Shell a -> Shell a
nubOn a -> b
f Shell a
s = (forall r. FoldShell a r -> IO r) -> Shell a
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell ((forall r. FoldShell a r -> IO r) -> Shell a)
-> (forall r. FoldShell a r -> IO r) -> Shell a
forall a b. (a -> b) -> a -> b
$ \(FoldShell x -> a -> IO x
step x
begin x -> IO r
done) -> do
let step' :: (x, Set b) -> a -> IO (x, Set b)
step' (x
x, Set b
bs) a
a | b -> Set b -> Bool
forall a. Ord a => a -> Set a -> Bool
Set.member (a -> b
f a
a) Set b
bs = (x, Set b) -> IO (x, Set b)
forall (m :: * -> *) a. Monad m => a -> m a
return (x
x, Set b
bs)
| Bool
otherwise = (, b -> Set b -> Set b
forall a. Ord a => a -> Set a -> Set a
Set.insert (a -> b
f a
a) Set b
bs) (x -> (x, Set b)) -> IO x -> IO (x, Set b)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> x -> a -> IO x
step x
x a
a
begin' :: (x, Set a)
begin' = (x
begin, Set a
forall a. Set a
Set.empty)
done' :: (x, b) -> IO r
done' (x
x, b
_) = x -> IO r
done x
x
Shell a -> FoldShell a r -> IO r
forall (io :: * -> *) a b.
MonadIO io =>
Shell a -> FoldShell a b -> io b
foldShell Shell a
s (((x, Set b) -> a -> IO (x, Set b))
-> (x, Set b) -> ((x, Set b) -> IO r) -> FoldShell a r
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell (x, Set b) -> a -> IO (x, Set b)
step' (x, Set b)
forall a. (x, Set a)
begin' (x, Set b) -> IO r
forall b. (x, b) -> IO r
done')
sort :: (Functor io, MonadIO io, Ord a) => Shell a -> io [a]
sort :: Shell a -> io [a]
sort = (a -> a) -> Shell a -> io [a]
forall (io :: * -> *) b a.
(Functor io, MonadIO io, Ord b) =>
(a -> b) -> Shell a -> io [a]
sortOn a -> a
forall a. a -> a
id
sortOn :: (Functor io, MonadIO io, Ord b) => (a -> b) -> Shell a -> io [a]
sortOn :: (a -> b) -> Shell a -> io [a]
sortOn a -> b
f = (a -> a -> Ordering) -> Shell a -> io [a]
forall (io :: * -> *) a.
(Functor io, MonadIO io) =>
(a -> a -> Ordering) -> Shell a -> io [a]
sortBy ((a -> b) -> a -> a -> Ordering
forall a b. Ord a => (b -> a) -> b -> b -> Ordering
comparing a -> b
f)
sortBy :: (Functor io, MonadIO io) => (a -> a -> Ordering) -> Shell a -> io [a]
sortBy :: (a -> a -> Ordering) -> Shell a -> io [a]
sortBy a -> a -> Ordering
f Shell a
s = (a -> a -> Ordering) -> [a] -> [a]
forall a. (a -> a -> Ordering) -> [a] -> [a]
List.sortBy a -> a -> Ordering
f ([a] -> [a]) -> io [a] -> io [a]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Shell a -> Fold a [a] -> io [a]
forall (io :: * -> *) a b.
MonadIO io =>
Shell a -> Fold a b -> io b
fold Shell a
s Fold a [a]
forall a. Fold a [a]
list
toLines :: Shell Text -> Shell Line
toLines :: Shell Text -> Shell Line
toLines (Shell forall r. FoldShell Text r -> IO r
k) = (forall r. FoldShell Line r -> IO r) -> Shell Line
forall a. (forall r. FoldShell a r -> IO r) -> Shell a
Shell forall r. FoldShell Line r -> IO r
k'
where
k' :: FoldShell Line b -> IO b
k' (FoldShell x -> Line -> IO x
step x
begin x -> IO b
done) =
FoldShell Text b -> IO b
forall r. FoldShell Text r -> IO r
k ((Pair x Line -> Text -> IO (Pair x Line))
-> Pair x Line -> (Pair x Line -> IO b) -> FoldShell Text b
forall a b x. (x -> a -> IO x) -> x -> (x -> IO b) -> FoldShell a b
FoldShell Pair x Line -> Text -> IO (Pair x Line)
step' Pair x Line
begin' Pair x Line -> IO b
done')
where
step' :: Pair x Line -> Text -> IO (Pair x Line)
step' (Pair x
x Line
prefix) Text
text = do
let Line
suffix :| [Line]
lines = Text -> NonEmpty Line
Turtle.Line.textToLines Text
text
let line :: Line
line = Line
prefix Line -> Line -> Line
forall a. Semigroup a => a -> a -> a
<> Line
suffix
let lines' :: NonEmpty Line
lines' = Line
line Line -> [Line] -> NonEmpty Line
forall a. a -> [a] -> NonEmpty a
:| [Line]
lines
x
x' <- (x -> Line -> IO x) -> x -> [Line] -> IO x
forall (t :: * -> *) (m :: * -> *) b a.
(Foldable t, Monad m) =>
(b -> a -> m b) -> b -> t a -> m b
foldM x -> Line -> IO x
step x
x (NonEmpty Line -> [Line]
forall a. NonEmpty a -> [a]
NonEmpty.init NonEmpty Line
lines')
let prefix' :: Line
prefix' = NonEmpty Line -> Line
forall a. NonEmpty a -> a
NonEmpty.last NonEmpty Line
lines'
Pair x Line -> IO (Pair x Line)
forall (m :: * -> *) a. Monad m => a -> m a
return (x -> Line -> Pair x Line
forall a b. a -> b -> Pair a b
Pair x
x' Line
prefix')
begin' :: Pair x Line
begin' = (x -> Line -> Pair x Line
forall a b. a -> b -> Pair a b
Pair x
begin Line
"")
done' :: Pair x Line -> IO b
done' (Pair x
x Line
prefix) = do
x
x' <- x -> Line -> IO x
step x
x Line
prefix
x -> IO b
done x
x'