filepather-0.5.5: Functions on System.FilePath
Safe HaskellSafe-Inferred
LanguageHaskell2010

System.FilePath.FilePather.ReadFilePaths

Documentation

data ReadFilePathsT e f a Source #

Instances

Instances details
MFunctor (ReadFilePathsT e :: (Type -> Type) -> Type -> TYPE LiftedRep) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

hoist :: forall m n (b :: k). Monad m => (forall a. m a -> n a) -> ReadFilePathsT e m b -> ReadFilePathsT e n b #

MonadError e f => MonadError e (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

throwError :: e -> ReadFilePathsT e f a #

catchError :: ReadFilePathsT e f a -> (e -> ReadFilePathsT e f a) -> ReadFilePathsT e f a #

MMonad (ReadFilePathsT e) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

embed :: forall (n :: Type -> Type) m b. Monad n => (forall a. m a -> ReadFilePathsT e n a) -> ReadFilePathsT e m b -> ReadFilePathsT e n b #

MonadTrans (ReadFilePathsT e) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

lift :: Monad m => m a -> ReadFilePathsT e m a #

Monad f => MonadReader [FilePath] (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

ask :: ReadFilePathsT e f [FilePath] #

local :: ([FilePath] -> [FilePath]) -> ReadFilePathsT e f a -> ReadFilePathsT e f a #

reader :: ([FilePath] -> a) -> ReadFilePathsT e f a #

MonadState [FilePath] f => MonadState [FilePath] (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

get :: ReadFilePathsT e f [FilePath] #

put :: [FilePath] -> ReadFilePathsT e f () #

state :: ([FilePath] -> (a, [FilePath])) -> ReadFilePathsT e f a #

MonadWriter [FilePath] f => MonadWriter [FilePath] (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

writer :: (a, [FilePath]) -> ReadFilePathsT e f a #

tell :: [FilePath] -> ReadFilePathsT e f () #

listen :: ReadFilePathsT e f a -> ReadFilePathsT e f (a, [FilePath]) #

pass :: ReadFilePathsT e f (a, [FilePath] -> [FilePath]) -> ReadFilePathsT e f a #

MonadFail f => MonadFail (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

fail :: String -> ReadFilePathsT e f a #

MonadFix f => MonadFix (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

mfix :: (a -> ReadFilePathsT e f a) -> ReadFilePathsT e f a #

MonadIO f => MonadIO (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

liftIO :: IO a -> ReadFilePathsT e f a #

MonadZip f => MonadZip (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

mzip :: ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f (a, b) #

mzipWith :: (a -> b -> c) -> ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f c #

munzip :: ReadFilePathsT e f (a, b) -> (ReadFilePathsT e f a, ReadFilePathsT e f b) #

Monad f => Applicative (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

pure :: a -> ReadFilePathsT e f a #

(<*>) :: ReadFilePathsT e f (a -> b) -> ReadFilePathsT e f a -> ReadFilePathsT e f b #

liftA2 :: (a -> b -> c) -> ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f c #

(*>) :: ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f b #

(<*) :: ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f a #

Functor f => Functor (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

fmap :: (a -> b) -> ReadFilePathsT e f a -> ReadFilePathsT e f b #

(<$) :: a -> ReadFilePathsT e f b -> ReadFilePathsT e f a #

Monad f => Monad (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

(>>=) :: ReadFilePathsT e f a -> (a -> ReadFilePathsT e f b) -> ReadFilePathsT e f b #

(>>) :: ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f b #

return :: a -> ReadFilePathsT e f a #

MonadCont f => MonadCont (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

callCC :: ((a -> ReadFilePathsT e f b) -> ReadFilePathsT e f a) -> ReadFilePathsT e f a #

Monad f => Alt (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Monad f => Apply (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

(<.>) :: ReadFilePathsT e f (a -> b) -> ReadFilePathsT e f a -> ReadFilePathsT e f b #

(.>) :: ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f b #

(<.) :: ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f a #

liftF2 :: (a -> b -> c) -> ReadFilePathsT e f a -> ReadFilePathsT e f b -> ReadFilePathsT e f c #

Monad f => Bind (ReadFilePathsT e f) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

(>>-) :: ReadFilePathsT e f a -> (a -> ReadFilePathsT e f b) -> ReadFilePathsT e f b #

join :: ReadFilePathsT e f (ReadFilePathsT e f a) -> ReadFilePathsT e f a #

(Monad f, Monoid a) => Monoid (ReadFilePathsT e f a) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

mempty :: ReadFilePathsT e f a #

mappend :: ReadFilePathsT e f a -> ReadFilePathsT e f a -> ReadFilePathsT e f a #

mconcat :: [ReadFilePathsT e f a] -> ReadFilePathsT e f a #

(Monad f, Semigroup a) => Semigroup (ReadFilePathsT e f a) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Methods

(<>) :: ReadFilePathsT e f a -> ReadFilePathsT e f a -> ReadFilePathsT e f a #

sconcat :: NonEmpty (ReadFilePathsT e f a) -> ReadFilePathsT e f a #

stimes :: Integral b => b -> ReadFilePathsT e f a -> ReadFilePathsT e f a #

Wrapped (ReadFilePathsT e f a) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

Associated Types

type Unwrapped (ReadFilePathsT e f a) #

ReadFilePathsT e f a ~ t => Rewrapped (ReadFilePathsT e' f' a') t Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

type Unwrapped (ReadFilePathsT e f a) Source # 
Instance details

Defined in System.FilePath.FilePather.ReadFilePaths

type Unwrapped (ReadFilePathsT e f a) = [FilePath] -> f (Either e a)