module FileEmbedLzma.Untyped (
embedByteString,
embedLazyByteString,
embedText,
embedLazyText,
embedDir,
embedRecursiveDir,
listDirectoryFiles,
listRecursiveDirectoryFiles,
listDirectoryFilesF,
lazyBytestringE,
) where
import Language.Haskell.TH (Exp, Q, unTypeCode)
import qualified Data.ByteString.Lazy as LBS
import qualified FileEmbedLzma
embedDir :: FilePath -> Q Exp
embedDir :: FilePath -> Q Exp
embedDir = Code Q [(FilePath, ByteString)] -> Q Exp
forall a (m :: * -> *). Quote m => Code m a -> m Exp
unTypeCode (Code Q [(FilePath, ByteString)] -> Q Exp)
-> (FilePath -> Code Q [(FilePath, ByteString)])
-> FilePath
-> Q Exp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> Code Q [(FilePath, ByteString)]
FileEmbedLzma.embedDir
embedRecursiveDir :: FilePath -> Q Exp
embedRecursiveDir :: FilePath -> Q Exp
embedRecursiveDir = Code Q [(FilePath, ByteString)] -> Q Exp
forall a (m :: * -> *). Quote m => Code m a -> m Exp
unTypeCode (Code Q [(FilePath, ByteString)] -> Q Exp)
-> (FilePath -> Code Q [(FilePath, ByteString)])
-> FilePath
-> Q Exp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> Code Q [(FilePath, ByteString)]
FileEmbedLzma.embedRecursiveDir
embedLazyByteString :: FilePath -> Q Exp
embedLazyByteString :: FilePath -> Q Exp
embedLazyByteString = Code Q ByteString -> Q Exp
forall a (m :: * -> *). Quote m => Code m a -> m Exp
unTypeCode (Code Q ByteString -> Q Exp)
-> (FilePath -> Code Q ByteString) -> FilePath -> Q Exp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> Code Q ByteString
FileEmbedLzma.embedLazyByteString
embedByteString :: FilePath -> Q Exp
embedByteString :: FilePath -> Q Exp
embedByteString = Code Q ByteString -> Q Exp
forall a (m :: * -> *). Quote m => Code m a -> m Exp
unTypeCode (Code Q ByteString -> Q Exp)
-> (FilePath -> Code Q ByteString) -> FilePath -> Q Exp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> Code Q ByteString
FileEmbedLzma.embedByteString
embedLazyText :: FilePath -> Q Exp
embedLazyText :: FilePath -> Q Exp
embedLazyText = Code Q Text -> Q Exp
forall a (m :: * -> *). Quote m => Code m a -> m Exp
unTypeCode (Code Q Text -> Q Exp)
-> (FilePath -> Code Q Text) -> FilePath -> Q Exp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> Code Q Text
FileEmbedLzma.embedLazyText
embedText :: FilePath -> Q Exp
embedText :: FilePath -> Q Exp
embedText = Code Q Text -> Q Exp
forall a (m :: * -> *). Quote m => Code m a -> m Exp
unTypeCode (Code Q Text -> Q Exp)
-> (FilePath -> Code Q Text) -> FilePath -> Q Exp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> Code Q Text
FileEmbedLzma.embedText
lazyBytestringE :: LBS.ByteString -> Q Exp
lazyBytestringE :: ByteString -> Q Exp
lazyBytestringE = Code Q ByteString -> Q Exp
forall a (m :: * -> *). Quote m => Code m a -> m Exp
unTypeCode (Code Q ByteString -> Q Exp)
-> (ByteString -> Code Q ByteString) -> ByteString -> Q Exp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> Code Q ByteString
FileEmbedLzma.lazyBytestringE
listRecursiveDirectoryFiles :: FilePath -> IO [(FilePath, LBS.ByteString)]
listRecursiveDirectoryFiles :: FilePath -> IO [(FilePath, ByteString)]
listRecursiveDirectoryFiles = FilePath -> IO [(FilePath, ByteString)]
FileEmbedLzma.listRecursiveDirectoryFiles
listDirectoryFiles :: FilePath -> IO [(FilePath, LBS.ByteString)]
listDirectoryFiles :: FilePath -> IO [(FilePath, ByteString)]
listDirectoryFiles = FilePath -> IO [(FilePath, ByteString)]
FileEmbedLzma.listDirectoryFiles
listDirectoryFilesF
:: (FilePath -> IO [(FilePath, LBS.ByteString)])
-> FilePath -> IO [(FilePath, LBS.ByteString)]
listDirectoryFilesF :: (FilePath -> IO [(FilePath, ByteString)])
-> FilePath -> IO [(FilePath, ByteString)]
listDirectoryFilesF = (FilePath -> IO [(FilePath, ByteString)])
-> FilePath -> IO [(FilePath, ByteString)]
FileEmbedLzma.listDirectoryFilesF