Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- type Parser = Parsec Void ByteString
- data PathSeg
- = Parent
- | PathSeg !ByteString
- fromPathSeg :: PathSeg -> ByteString
- pathSeg :: Parser (Maybe PathSeg)
- pathSeg' :: Parser (Maybe PathSeg)
- relpath :: Parser (Path 'Rel)
- abspath :: Parser (Path 'Abs)
- data PathType
- newtype Path (t :: PathType) = Path {}
- fromRel :: Path 'Rel -> ByteString
- fromAbs :: Path 'Abs -> ByteString
- hush :: Either a b -> Maybe b
- parseRel :: ByteString -> Maybe (Path 'Rel)
- parseAbs :: ByteString -> Maybe (Path 'Abs)
- mkAbs :: ByteString -> Q Exp
- mkRel :: ByteString -> Q Exp
- qq :: (ByteString -> Q Exp) -> QuasiQuoter
- absp :: QuasiQuoter
- relp :: QuasiQuoter
- (</>) :: Path t -> Path 'Rel -> Path t
- stripPrefix :: Path t -> Path t -> Maybe (Path 'Rel)
- isPrefixOf :: Path t -> Path t -> Bool
- parent :: Path t -> Path t
- filename :: Path t -> Path 'Rel
Documentation
Instances
Eq PathSeg Source # | |
Show PathSeg Source # | |
Generic PathSeg Source # | |
Lift PathSeg Source # | |
type Rep PathSeg Source # | |
Defined in Path.Internal type Rep PathSeg = D1 ('MetaData "PathSeg" "Path.Internal" "bpath-0.1.0-inplace" 'False) (C1 ('MetaCons "Parent" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PathSeg" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 ByteString))) |
fromPathSeg :: PathSeg -> ByteString Source #
newtype Path (t :: PathType) Source #
A canonicalized file path
qq :: (ByteString -> Q Exp) -> QuasiQuoter Source #
absp :: QuasiQuoter Source #
relp :: QuasiQuoter Source #