{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE MultiWayIf #-}
{-# LANGUAGE CApiFFI #-}
module GHCup.Prelude.File.Posix where
import Conduit
import Control.Exception.Safe
import Foreign.C.String
import Foreign.C.Error
import Foreign.C.Types
import System.IO ( hClose, hSetBinaryMode )
import System.IO.Error hiding ( catchIOError )
import System.FilePath
import System.Directory ( removeFile, pathIsSymbolicLink, getSymbolicLinkTarget, doesPathExist )
import System.Posix.Error ( throwErrnoPathIfMinus1Retry )
import System.Posix.Internals ( withFilePath )
import System.Posix.Files
import System.Posix.Types
import qualified System.Posix.Directory as PD
import qualified System.Posix.Files as PF
import qualified System.Posix.IO as SPI
import qualified System.Posix as Posix
import qualified GHCup.Prelude.File.Posix.Foreign as FD
import GHCup.Prelude.File.Posix.Traversals
import GHC.IO.Exception (IOException(ioe_type), IOErrorType (..))
import qualified Data.Conduit.Combinators as C
getLinkTarget :: FilePath -> IO FilePath
getLinkTarget :: FilePath -> IO FilePath
getLinkTarget = FilePath -> IO FilePath
getSymbolicLinkTarget
pathIsLink :: FilePath -> IO Bool
pathIsLink :: FilePath -> IO Bool
pathIsLink = FilePath -> IO Bool
pathIsSymbolicLink
chmod_755 :: MonadIO m => FilePath -> m ()
chmod_755 :: forall (m :: * -> *). MonadIO m => FilePath -> m ()
chmod_755 FilePath
fp = do
let exe_mode :: FileMode
exe_mode =
FileMode
nullFileMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
ownerExecuteMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
ownerReadMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
ownerWriteMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
groupExecuteMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
groupReadMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
otherExecuteMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
otherReadMode
IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ FilePath -> FileMode -> IO ()
setFileMode FilePath
fp FileMode
exe_mode
newFilePerms :: FileMode
newFilePerms :: FileMode
newFilePerms =
FileMode
ownerWriteMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
ownerReadMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
groupWriteMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
groupReadMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
otherWriteMode
FileMode -> FileMode -> FileMode
`unionFileModes` FileMode
otherReadMode
isBrokenSymlink :: FilePath -> IO Bool
isBrokenSymlink :: FilePath -> IO Bool
isBrokenSymlink FilePath
fp = do
IO Bool -> IO (Either IOException Bool)
forall (m :: * -> *) e a.
(HasCallStack, MonadCatch m, Exception e) =>
m a -> m (Either e a)
try (FilePath -> IO Bool
pathIsSymbolicLink FilePath
fp) IO (Either IOException Bool)
-> (Either IOException Bool -> IO Bool) -> IO Bool
forall a b. IO a -> (a -> IO b) -> IO b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= \case
Right Bool
True -> do
let symDir :: FilePath
symDir = FilePath -> FilePath
takeDirectory FilePath
fp
FilePath
tfp <- FilePath -> IO FilePath
getSymbolicLinkTarget FilePath
fp
Bool -> Bool
not (Bool -> Bool) -> IO Bool -> IO Bool
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> FilePath -> IO Bool
doesPathExist
(FilePath
symDir FilePath -> FilePath -> FilePath
</> FilePath
tfp)
Right Bool
b -> Bool -> IO Bool
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure Bool
b
Left IOException
e | IOException -> Bool
isDoesNotExistError IOException
e -> Bool -> IO Bool
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure Bool
False
| Bool
otherwise -> IOException -> IO Bool
forall (m :: * -> *) e a.
(HasCallStack, MonadThrow m, Exception e) =>
e -> m a
throwIO IOException
e
copyFile :: FilePath
-> FilePath
-> Bool
-> IO ()
copyFile :: FilePath -> FilePath -> Bool -> IO ()
copyFile FilePath
from FilePath
to Bool
fail' = do
IO (Fd, Handle)
-> ((Fd, Handle) -> IO ()) -> ((Fd, Handle) -> IO ()) -> IO ()
forall (m :: * -> *) a b c.
(HasCallStack, MonadMask m) =>
m a -> (a -> m b) -> (a -> m c) -> m c
bracket
(FilePath
-> OpenMode -> [Flags] -> Maybe FileMode -> IO (Fd, Handle)
openFdHandle FilePath
from OpenMode
SPI.ReadOnly [Flags
FD.oNofollow] Maybe FileMode
forall a. Maybe a
Nothing)
(Handle -> IO ()
hClose (Handle -> IO ())
-> ((Fd, Handle) -> Handle) -> (Fd, Handle) -> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Fd, Handle) -> Handle
forall a b. (a, b) -> b
snd)
(((Fd, Handle) -> IO ()) -> IO ())
-> ((Fd, Handle) -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \(Fd
fromFd, Handle
fH) -> do
FileMode
sourceFileMode <- FileStatus -> FileMode
fileMode (FileStatus -> FileMode) -> IO FileStatus -> IO FileMode
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Fd -> IO FileStatus
getFdStatus Fd
fromFd
let dflags :: [Flags]
dflags = [ Flags
FD.oNofollow
, if Bool
fail' then Flags
FD.oExcl else Flags
FD.oTrunc
]
let openFdHandle' :: IO (Fd, Handle)
openFdHandle' = FilePath
-> OpenMode -> [Flags] -> Maybe FileMode -> IO (Fd, Handle)
openFdHandle FilePath
to OpenMode
SPI.WriteOnly [Flags]
dflags (Maybe FileMode -> IO (Fd, Handle))
-> Maybe FileMode -> IO (Fd, Handle)
forall a b. (a -> b) -> a -> b
$ FileMode -> Maybe FileMode
forall a. a -> Maybe a
Just FileMode
sourceFileMode
IO (Fd, Handle)
-> ((Fd, Handle) -> IO ()) -> ((Fd, Handle) -> IO ()) -> IO ()
forall (m :: * -> *) a b c.
(HasCallStack, MonadMask m) =>
m a -> (a -> m b) -> (a -> m c) -> m c
bracket
((IOException -> IO (Fd, Handle))
-> IO (Fd, Handle) -> IO (Fd, Handle)
forall (m :: * -> *) a.
(HasCallStack, MonadCatch m) =>
(IOException -> m a) -> m a -> m a
handleIO (\IOException
e -> if
| IOException -> IOErrorType
ioe_type IOException
e IOErrorType -> IOErrorType -> Bool
forall a. Eq a => a -> a -> Bool
== IOErrorType
InvalidArgument
, Bool -> Bool
not Bool
fail' -> do
FilePath -> IO ()
removeLink FilePath
to
IO (Fd, Handle)
openFdHandle'
| Bool
otherwise -> IOException -> IO (Fd, Handle)
forall (m :: * -> *) e a.
(HasCallStack, MonadThrow m, Exception e) =>
e -> m a
throwIO IOException
e
)
IO (Fd, Handle)
openFdHandle')
(Handle -> IO ()
hClose (Handle -> IO ())
-> ((Fd, Handle) -> Handle) -> (Fd, Handle) -> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Fd, Handle) -> Handle
forall a b. (a, b) -> b
snd)
(((Fd, Handle) -> IO ()) -> IO ())
-> ((Fd, Handle) -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \(Fd
_, Handle
tH) -> do
Handle -> Bool -> IO ()
hSetBinaryMode Handle
fH Bool
True
Handle -> Bool -> IO ()
hSetBinaryMode Handle
tH Bool
True
ConduitT () Void (ResourceT IO) () -> IO ()
forall (m :: * -> *) r.
MonadUnliftIO m =>
ConduitT () Void (ResourceT m) r -> m r
runConduitRes (ConduitT () Void (ResourceT IO) () -> IO ())
-> ConduitT () Void (ResourceT IO) () -> IO ()
forall a b. (a -> b) -> a -> b
$ Handle -> ConduitT () ByteString (ResourceT IO) ()
forall (m :: * -> *) i.
MonadIO m =>
Handle -> ConduitT i ByteString m ()
sourceHandle Handle
fH ConduitT () ByteString (ResourceT IO) ()
-> ConduitT ByteString Void (ResourceT IO) ()
-> ConduitT () Void (ResourceT IO) ()
forall (m :: * -> *) a b c r.
Monad m =>
ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r
.| Handle -> ConduitT ByteString Void (ResourceT IO) ()
forall (m :: * -> *) o.
MonadIO m =>
Handle -> ConduitT ByteString o m ()
sinkHandle Handle
tH
where
openFdHandle :: FilePath
-> OpenMode -> [Flags] -> Maybe FileMode -> IO (Fd, Handle)
openFdHandle FilePath
fp OpenMode
omode [Flags]
flags Maybe FileMode
fM = do
Fd
fd <- FilePath -> OpenMode -> [Flags] -> Maybe FileMode -> IO Fd
openFd' FilePath
fp OpenMode
omode [Flags]
flags Maybe FileMode
fM
Handle
handle' <- Fd -> IO Handle
SPI.fdToHandle Fd
fd
(Fd, Handle) -> IO (Fd, Handle)
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Fd
fd, Handle
handle')
foreign import capi unsafe "fcntl.h open"
c_open :: CString -> CInt -> Posix.CMode -> IO CInt
open_ :: CString
-> Posix.OpenMode
-> [FD.Flags]
-> Maybe Posix.FileMode
-> IO Posix.Fd
open_ :: CString -> OpenMode -> [Flags] -> Maybe FileMode -> IO Fd
open_ CString
str OpenMode
how [Flags]
optional_flags Maybe FileMode
maybe_mode = do
CInt
fd <- CString -> CInt -> FileMode -> IO CInt
c_open CString
str CInt
all_flags FileMode
mode_w
Fd -> IO Fd
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (CInt -> Fd
Posix.Fd CInt
fd)
where
all_flags :: CInt
all_flags = [Flags] -> CInt
FD.unionFlags ([Flags] -> CInt) -> [Flags] -> CInt
forall a b. (a -> b) -> a -> b
$ [Flags]
optional_flags [Flags] -> [Flags] -> [Flags]
forall a. [a] -> [a] -> [a]
++ [Flags
open_mode] [Flags] -> [Flags] -> [Flags]
forall a. [a] -> [a] -> [a]
++ [Flags]
creat
([Flags]
creat, FileMode
mode_w) = case Maybe FileMode
maybe_mode of
Maybe FileMode
Nothing -> ([],FileMode
0)
Just FileMode
x -> ([Flags
FD.oCreat], FileMode
x)
open_mode :: Flags
open_mode = case OpenMode
how of
OpenMode
Posix.ReadOnly -> Flags
FD.oRdonly
OpenMode
Posix.WriteOnly -> Flags
FD.oWronly
OpenMode
Posix.ReadWrite -> Flags
FD.oRdwr
openFd' :: FilePath
-> Posix.OpenMode
-> [FD.Flags]
-> Maybe Posix.FileMode
-> IO Posix.Fd
openFd' :: FilePath -> OpenMode -> [Flags] -> Maybe FileMode -> IO Fd
openFd' FilePath
name OpenMode
how [Flags]
optional_flags Maybe FileMode
maybe_mode =
FilePath -> (CString -> IO Fd) -> IO Fd
forall a. FilePath -> (CString -> IO a) -> IO a
withFilePath FilePath
name ((CString -> IO Fd) -> IO Fd) -> (CString -> IO Fd) -> IO Fd
forall a b. (a -> b) -> a -> b
$ \CString
str ->
FilePath -> FilePath -> IO Fd -> IO Fd
forall a. (Eq a, Num a) => FilePath -> FilePath -> IO a -> IO a
throwErrnoPathIfMinus1Retry FilePath
"openFd" FilePath
name (IO Fd -> IO Fd) -> IO Fd -> IO Fd
forall a b. (a -> b) -> a -> b
$
CString -> OpenMode -> [Flags] -> Maybe FileMode -> IO Fd
open_ CString
str OpenMode
how [Flags]
optional_flags Maybe FileMode
maybe_mode
deleteFile :: FilePath -> IO ()
deleteFile :: FilePath -> IO ()
deleteFile = FilePath -> IO ()
removeLink
recreateSymlink :: FilePath
-> FilePath
-> Bool
-> IO ()
recreateSymlink :: FilePath -> FilePath -> Bool -> IO ()
recreateSymlink FilePath
symsource FilePath
newsym Bool
fail' = do
FilePath
sympoint <- FilePath -> IO FilePath
readSymbolicLink FilePath
symsource
case Bool
fail' of
Bool
True -> () -> IO ()
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
Bool
False ->
(IOException -> IO ()) -> IO () -> IO ()
forall (m :: * -> *) a.
(HasCallStack, MonadCatch m) =>
(IOException -> m a) -> m a -> m a
handleIO (\IOException
e -> if IOErrorType
doesNotExistErrorType IOErrorType -> IOErrorType -> Bool
forall a. Eq a => a -> a -> Bool
== IOException -> IOErrorType
ioeGetErrorType IOException
e then () -> IO ()
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure () else IO () -> IO ()
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> IO ()) -> (IOException -> IO ()) -> IOException -> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. IOException -> IO ()
forall a. IOException -> IO a
ioError (IOException -> IO ()) -> IOException -> IO ()
forall a b. (a -> b) -> a -> b
$ IOException
e) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$ FilePath -> IO ()
deleteFile FilePath
newsym
FilePath -> FilePath -> IO ()
createSymbolicLink FilePath
sympoint FilePath
newsym
install :: FilePath -> FilePath -> Bool -> IO ()
install :: FilePath -> FilePath -> Bool -> IO ()
install FilePath
from FilePath
to Bool
fail' = do
FileStatus
fs <- FilePath -> IO FileStatus
PF.getSymbolicLinkStatus FilePath
from
FileStatus -> IO ()
decide FileStatus
fs
where
decide :: FileStatus -> IO ()
decide FileStatus
fs | FileStatus -> Bool
PF.isRegularFile FileStatus
fs = FilePath -> FilePath -> Bool -> IO ()
copyFile FilePath
from FilePath
to Bool
fail'
| FileStatus -> Bool
PF.isSymbolicLink FileStatus
fs = FilePath -> FilePath -> Bool -> IO ()
recreateSymlink FilePath
from FilePath
to Bool
fail'
| Bool
otherwise = IOException -> IO ()
forall a. IOException -> IO a
ioError (IOException -> IO ()) -> IOException -> IO ()
forall a b. (a -> b) -> a -> b
$ IOErrorType
-> FilePath -> Maybe Handle -> Maybe FilePath -> IOException
mkIOError IOErrorType
illegalOperationErrorType FilePath
"install: not a regular file or symlink" Maybe Handle
forall a. Maybe a
Nothing (FilePath -> Maybe FilePath
forall a. a -> Maybe a
Just FilePath
from)
moveFile :: FilePath -> FilePath -> IO ()
moveFile :: FilePath -> FilePath -> IO ()
moveFile = FilePath -> FilePath -> IO ()
rename
moveFilePortable :: FilePath -> FilePath -> IO ()
moveFilePortable :: FilePath -> FilePath -> IO ()
moveFilePortable FilePath
from FilePath
to = do
[Errno] -> IO () -> IO () -> IO ()
forall a. [Errno] -> IO a -> IO a -> IO a
catchErrno [Errno
eXDEV] (FilePath -> FilePath -> IO ()
moveFile FilePath
from FilePath
to) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$ do
FilePath -> FilePath -> Bool -> IO ()
copyFile FilePath
from FilePath
to Bool
True
FilePath -> IO ()
removeFile FilePath
from
catchErrno :: [Errno]
-> IO a
-> IO a
-> IO a
catchErrno :: forall a. [Errno] -> IO a -> IO a -> IO a
catchErrno [Errno]
en IO a
a1 IO a
a2 =
IO a -> (IOException -> IO a) -> IO a
forall (m :: * -> *) a.
(HasCallStack, MonadCatch m) =>
m a -> (IOException -> m a) -> m a
catchIOError IO a
a1 ((IOException -> IO a) -> IO a) -> (IOException -> IO a) -> IO a
forall a b. (a -> b) -> a -> b
$ \IOException
e -> do
Errno
errno <- IO Errno
getErrno
if Errno
errno Errno -> [Errno] -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` [Errno]
en
then IO a
a2
else IOException -> IO a
forall a. IOException -> IO a
ioError IOException
e
removeEmptyDirectory :: FilePath -> IO ()
removeEmptyDirectory :: FilePath -> IO ()
removeEmptyDirectory = FilePath -> IO ()
PD.removeDirectory
sourceDirectory' :: MonadResource m => FilePath -> ConduitT i (FD.DirType, FilePath) m ()
sourceDirectory' :: forall (m :: * -> *) i.
MonadResource m =>
FilePath -> ConduitT i (DirType, FilePath) m ()
sourceDirectory' FilePath
dir =
IO DirStreamPortable
-> (DirStreamPortable -> IO ())
-> (DirStreamPortable -> ConduitT i (DirType, FilePath) m ())
-> ConduitT i (DirType, FilePath) m ()
forall (m :: * -> *) a i o r.
MonadResource m =>
IO a -> (a -> IO ()) -> (a -> ConduitT i o m r) -> ConduitT i o m r
bracketP (FilePath -> IO DirStreamPortable
openDirStreamPortable FilePath
dir) DirStreamPortable -> IO ()
closeDirStreamPortable DirStreamPortable -> ConduitT i (DirType, FilePath) m ()
forall {m :: * -> *} {i}.
MonadIO m =>
DirStreamPortable -> ConduitT i (DirType, FilePath) m ()
go
where
go :: DirStreamPortable -> ConduitT i (DirType, FilePath) m ()
go DirStreamPortable
ds =
ConduitT i (DirType, FilePath) m ()
loop
where
loop :: ConduitT i (DirType, FilePath) m ()
loop = do
(DirType
typ, FilePath
e) <- IO (DirType, FilePath)
-> ConduitT i (DirType, FilePath) m (DirType, FilePath)
forall a. IO a -> ConduitT i (DirType, FilePath) m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO (DirType, FilePath)
-> ConduitT i (DirType, FilePath) m (DirType, FilePath))
-> IO (DirType, FilePath)
-> ConduitT i (DirType, FilePath) m (DirType, FilePath)
forall a b. (a -> b) -> a -> b
$ DirStreamPortable -> IO (DirType, FilePath)
readDirEntPortable DirStreamPortable
ds
if
| FilePath -> Bool
forall a. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null FilePath
e -> () -> ConduitT i (DirType, FilePath) m ()
forall a. a -> ConduitT i (DirType, FilePath) m a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
| FilePath
"." FilePath -> FilePath -> Bool
forall a. Eq a => a -> a -> Bool
== FilePath
e -> ConduitT i (DirType, FilePath) m ()
loop
| FilePath
".." FilePath -> FilePath -> Bool
forall a. Eq a => a -> a -> Bool
== FilePath
e -> ConduitT i (DirType, FilePath) m ()
loop
| Bool
otherwise -> do
(DirType, FilePath) -> ConduitT i (DirType, FilePath) m ()
forall (m :: * -> *) o i. Monad m => o -> ConduitT i o m ()
yield (DirType
typ, FilePath
e)
ConduitT i (DirType, FilePath) m ()
loop
sourceDirectoryDeep' :: MonadResource m
=> FilePath
-> ConduitT i FilePath m ()
sourceDirectoryDeep' :: forall (m :: * -> *) i.
MonadResource m =>
FilePath -> ConduitT i FilePath m ()
sourceDirectoryDeep' FilePath
fp' = FilePath -> ConduitT i (DirType, FilePath) m ()
forall (m :: * -> *) i.
MonadResource m =>
FilePath -> ConduitT i (DirType, FilePath) m ()
start FilePath
"" ConduitT i (DirType, FilePath) m ()
-> ConduitT (DirType, FilePath) FilePath m ()
-> ConduitT i FilePath m ()
forall (m :: * -> *) a b c r.
Monad m =>
ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r
.| ((DirType, FilePath) -> FilePath)
-> ConduitT (DirType, FilePath) FilePath m ()
forall (m :: * -> *) a b. Monad m => (a -> b) -> ConduitT a b m ()
C.map (DirType, FilePath) -> FilePath
forall a b. (a, b) -> b
snd
where
start :: MonadResource m => FilePath -> ConduitT i (FD.DirType, FilePath) m ()
start :: forall (m :: * -> *) i.
MonadResource m =>
FilePath -> ConduitT i (DirType, FilePath) m ()
start FilePath
dir = FilePath -> ConduitT i (DirType, FilePath) m ()
forall (m :: * -> *) i.
MonadResource m =>
FilePath -> ConduitT i (DirType, FilePath) m ()
sourceDirectory' (FilePath
fp' FilePath -> FilePath -> FilePath
</> FilePath
dir) ConduitT i (DirType, FilePath) m ()
-> ConduitT (DirType, FilePath) (DirType, FilePath) m ()
-> ConduitT i (DirType, FilePath) m ()
forall (m :: * -> *) a b c r.
Monad m =>
ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r
.| ((DirType, FilePath)
-> ConduitT (DirType, FilePath) (DirType, FilePath) m ())
-> ConduitT (DirType, FilePath) (DirType, FilePath) m ()
forall (m :: * -> *) i o r.
Monad m =>
(i -> ConduitT i o m r) -> ConduitT i o m ()
awaitForever (DirType, FilePath)
-> ConduitT (DirType, FilePath) (DirType, FilePath) m ()
forall (m :: * -> *).
MonadResource m =>
(DirType, FilePath)
-> ConduitT (DirType, FilePath) (DirType, FilePath) m ()
go
where
go :: MonadResource m => (FD.DirType, FilePath) -> ConduitT (FD.DirType, FilePath) (FD.DirType, FilePath) m ()
go :: forall (m :: * -> *).
MonadResource m =>
(DirType, FilePath)
-> ConduitT (DirType, FilePath) (DirType, FilePath) m ()
go (DirType
typ, FilePath
fp)
| DirType
FD.dtDir DirType -> DirType -> Bool
forall a. Eq a => a -> a -> Bool
== DirType
typ = FilePath -> ConduitT (DirType, FilePath) (DirType, FilePath) m ()
forall (m :: * -> *) i.
MonadResource m =>
FilePath -> ConduitT i (DirType, FilePath) m ()
start (FilePath
dir FilePath -> FilePath -> FilePath
</> FilePath
fp)
| Bool
otherwise = (DirType, FilePath)
-> ConduitT (DirType, FilePath) (DirType, FilePath) m ()
forall (m :: * -> *) o i. Monad m => o -> ConduitT i o m ()
yield (DirType
typ, FilePath
dir FilePath -> FilePath -> FilePath
</> FilePath
fp)