Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- hsEntriesAbs :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> ArchiveM [Entry FilePath e]
- unpackEntriesFp :: ArchivePtr -> FilePath -> ArchiveM ()
- unpackArchive :: FilePath -> FilePath -> ArchiveM ()
- readArchiveFile :: FilePath -> ArchiveM [Entry FilePath ByteString]
- readArchiveBS :: ByteString -> Either ArchiveResult [Entry FilePath ByteString]
- archiveFile :: FilePath -> ArchivePtr -> ArchiveM ()
- bsToArchive :: ByteString -> ArchiveM (ArchivePtr, IO ())
- unpackToDir :: FilePath -> ByteString -> ArchiveM ()
- readBS :: ArchivePtr -> Int -> IO ByteString
- readBSL :: ArchivePtr -> Int -> IO ByteString
- readEntry :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> ArchiveEntryPtr -> IO (Entry FilePath e)
- readContents :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> ArchiveEntryPtr -> IO (EntryContent FilePath e)
- readOwnership :: ArchiveEntryPtr -> IO Ownership
- readTimes :: ArchiveEntryPtr -> IO (Maybe ModTime)
- getHsEntry :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> IO (Maybe (Entry FilePath e))
- hsEntries :: ArchivePtr -> ArchiveM [Entry FilePath ByteString]
- hsEntriesST :: ArchivePtr -> ST s [Entry FilePath ByteString]
- hsEntriesSTLazy :: ArchivePtr -> ST s [Entry FilePath ByteString]
- hsEntriesSTAbs :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> ST s [Entry FilePath e]
- archiveGetterHelper :: (ArchiveEntryPtr -> IO a) -> (ArchiveEntryPtr -> IO Bool) -> ArchiveEntryPtr -> IO (Maybe a)
- archiveGetterNull :: (ArchiveEntryPtr -> IO CString) -> ArchiveEntryPtr -> IO (Maybe String)
Documentation
hsEntriesAbs :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> ArchiveM [Entry FilePath e] Source #
unpackEntriesFp :: ArchivePtr -> FilePath -> ArchiveM () Source #
Unpack an archive in a given directory
This is more efficient than
unpackToDir "llvm" =<< BS.readFile "llvm.tar"
readArchiveFile :: FilePath -> ArchiveM [Entry FilePath ByteString] Source #
Read an archive from a file. The format of the archive is automatically detected.
Since: 1.0.0.0
readArchiveBS :: ByteString -> Either ArchiveResult [Entry FilePath ByteString] Source #
Read an archive contained in a ByteString
. The format of the archive is
automatically detected.
Since: 1.0.0.0
archiveFile :: FilePath -> ArchivePtr -> ArchiveM () Source #
bsToArchive :: ByteString -> ArchiveM (ArchivePtr, IO ()) Source #
:: FilePath | Directory to unpack in |
-> ByteString |
|
-> ArchiveM () |
readBS :: ArchivePtr -> Int -> IO ByteString Source #
readBSL :: ArchivePtr -> Int -> IO ByteString Source #
readEntry :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> ArchiveEntryPtr -> IO (Entry FilePath e) Source #
readContents :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> ArchiveEntryPtr -> IO (EntryContent FilePath e) Source #
getHsEntry :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> IO (Maybe (Entry FilePath e)) Source #
Yield the next entry in an archive
hsEntries :: ArchivePtr -> ArchiveM [Entry FilePath ByteString] Source #
Return a list of Entry
s.
hsEntriesST :: ArchivePtr -> ST s [Entry FilePath ByteString] Source #
Return a list of Entry
s.
hsEntriesSTLazy :: ArchivePtr -> ST s [Entry FilePath ByteString] Source #
hsEntriesSTAbs :: Integral a => (ArchivePtr -> a -> IO e) -> ArchivePtr -> ST s [Entry FilePath e] Source #
archiveGetterHelper :: (ArchiveEntryPtr -> IO a) -> (ArchiveEntryPtr -> IO Bool) -> ArchiveEntryPtr -> IO (Maybe a) Source #
archiveGetterNull :: (ArchiveEntryPtr -> IO CString) -> ArchiveEntryPtr -> IO (Maybe String) Source #