| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Hledger.Flow.PathHelpers
Synopsis
- type TurtlePath = FilePath
- type AbsFile = Path Abs File
- type RelFile = Path Rel File
- type AbsDir = Path Abs Dir
- type RelDir = Path Rel Dir
- data PathException
- fromTurtleAbsFile :: MonadThrow m => TurtlePath -> m AbsFile
- fromTurtleRelFile :: MonadThrow m => TurtlePath -> m RelFile
- fromTurtleAbsDir :: MonadThrow m => TurtlePath -> m AbsDir
- fromTurtleRelDir :: MonadThrow m => TurtlePath -> m RelDir
- turtleToAbsDir :: (MonadIO m, MonadThrow m) => AbsDir -> TurtlePath -> m AbsDir
- pathToTurtle :: Path b t -> TurtlePath
- forceTrailingSlash :: TurtlePath -> TurtlePath
- pathSize :: Path b Dir -> Int
- pathSize' :: Path b Dir -> Int -> Int
- findFilesIn :: MonadIO m => (AbsDir -> Bool) -> [RelDir] -> AbsDir -> m [AbsFile]
- excludeHiddenFiles :: [AbsFile] -> [AbsFile]
Documentation
type TurtlePath = FilePath Source #
data PathException Source #
Constructors
| MissingBaseDir AbsDir | |
| InvalidTurtleDir TurtlePath |
Instances
| Eq PathException Source # | |
Defined in Hledger.Flow.PathHelpers Methods (==) :: PathException -> PathException -> Bool # (/=) :: PathException -> PathException -> Bool # | |
| Show PathException Source # | |
Defined in Hledger.Flow.PathHelpers Methods showsPrec :: Int -> PathException -> ShowS # show :: PathException -> String # showList :: [PathException] -> ShowS # | |
| Exception PathException Source # | |
Defined in Hledger.Flow.PathHelpers Methods toException :: PathException -> SomeException # fromException :: SomeException -> Maybe PathException # displayException :: PathException -> String # | |
fromTurtleAbsFile :: MonadThrow m => TurtlePath -> m AbsFile Source #
fromTurtleRelFile :: MonadThrow m => TurtlePath -> m RelFile Source #
fromTurtleAbsDir :: MonadThrow m => TurtlePath -> m AbsDir Source #
fromTurtleRelDir :: MonadThrow m => TurtlePath -> m RelDir Source #
turtleToAbsDir :: (MonadIO m, MonadThrow m) => AbsDir -> TurtlePath -> m AbsDir Source #
pathToTurtle :: Path b t -> TurtlePath Source #
Arguments
| :: MonadIO m | |
| => (AbsDir -> Bool) | Do we want the files in this directory? |
| -> [RelDir] | Exclude these directory names |
| -> AbsDir | Top of the search tree |
| -> m [AbsFile] | Absolute paths to all files in the directories which match the predicate |
Do a recursive search starting from the given directory. Return all files contained in each directory which matches the given predicate.
excludeHiddenFiles :: [AbsFile] -> [AbsFile] Source #