{-# LINE 1 "Z/IO/BIO/Zlib.hsc" #-}
module Z.IO.BIO.Zlib(
newCompress, compressReset
, compress
, compressBlocks
, ZStream
, CompressConfig(..)
, defaultCompressConfig
, newDecompress, decompressReset
, decompress
, decompressBlocks
, DecompressConfig(..)
, defaultDecompressConfig
, WindowBits
, defaultWindowBits
, MemLevel
, defaultMemLevel
, Strategy
, pattern Z_FILTERED
, pattern Z_HUFFMAN_ONLY
, pattern Z_RLE
, pattern Z_FIXED
, pattern Z_DEFAULT_STRATEGY
, CompressLevel
, pattern Z_BEST_SPEED
, pattern Z_BEST_COMPRESSION
, pattern Z_DEFAULT_COMPRESSION
) where
import Control.Monad
import Data.IORef
import qualified Data.List as List
import Data.Word
import Foreign hiding (void)
import Foreign.C
import GHC.Generics
import Z.Data.Array as A
import Z.Data.CBytes as CBytes
import Z.Data.JSON (JSON)
import Z.Data.Text.Print (Print)
import Z.Data.Vector.Base as V
import Z.Foreign
import Z.IO.BIO
import Z.IO.Exception
type Strategy = CInt
pattern Z_FILTERED :: Strategy
pattern Z_HUFFMAN_ONLY :: Strategy
pattern Z_RLE :: Strategy
pattern Z_FIXED :: Strategy
pattern Z_DEFAULT_STRATEGY :: Strategy
pattern Z_FILTERED = 1
{-# LINE 81 "Z/IO/BIO/Zlib.hsc" #-}
pattern Z_HUFFMAN_ONLY = 2
{-# LINE 82 "Z/IO/BIO/Zlib.hsc" #-}
pattern Z_RLE = 3
{-# LINE 83 "Z/IO/BIO/Zlib.hsc" #-}
pattern Z_FIXED = 4
{-# LINE 84 "Z/IO/BIO/Zlib.hsc" #-}
pattern Z_DEFAULT_STRATEGY = 0
{-# LINE 85 "Z/IO/BIO/Zlib.hsc" #-}
type CompressLevel = CInt
pattern Z_BEST_SPEED :: CompressLevel
pattern Z_BEST_COMPRESSION :: CompressLevel
pattern Z_DEFAULT_COMPRESSION :: CompressLevel
pattern Z_BEST_SPEED = 1
{-# LINE 93 "Z/IO/BIO/Zlib.hsc" #-}
pattern Z_BEST_COMPRESSION = 9
{-# LINE 94 "Z/IO/BIO/Zlib.hsc" #-}
pattern Z_DEFAULT_COMPRESSION = -1
{-# LINE 95 "Z/IO/BIO/Zlib.hsc" #-}
type WindowBits = CInt
defaultWindowBits :: WindowBits
defaultWindowBits = 15
type MemLevel = CInt
defaultMemLevel :: MemLevel
defaultMemLevel = 9
data CompressConfig = CompressConfig
{ compressLevel :: CompressLevel
, compressWindowBits :: WindowBits
, compressMemoryLevel :: MemLevel
, compressDictionary :: V.Bytes
, compressStrategy :: Strategy
, compressBufferSize :: Int
} deriving (Show, Eq, Ord, Generic)
deriving anyclass (Print, JSON)
defaultCompressConfig :: CompressConfig
defaultCompressConfig =
CompressConfig Z_DEFAULT_COMPRESSION defaultWindowBits
defaultMemLevel V.empty Z_DEFAULT_STRATEGY V.defaultChunkSize
data ZStream = ZStream (ForeignPtr ZStream) (IORef Bool)
newCompress :: HasCallStack
=> CompressConfig
-> IO (ZStream, BIO V.Bytes V.Bytes)
newCompress (CompressConfig level windowBits memLevel dict strategy bufSiz) = do
zs <- mask_ (newForeignPtr free_z_stream_deflate =<< create_z_stream)
buf <- A.newPinnedPrimArray bufSiz
set_avail_out zs buf bufSiz
bufRef <- newIORef buf
withForeignPtr zs $ \ ps -> do
throwZlibIfMinus_ $ deflate_init2 ps level windowBits memLevel strategy
unless (V.null dict) $
throwZlibIfMinus_ . withPrimVectorUnsafe dict $ \ pdict off len ->
deflate_set_dictionary ps pdict off (fromIntegral $ len)
finRef <- newIORef False
return (ZStream zs finRef, BIO (zwrite zs bufRef) (zflush finRef zs bufRef []))
where
zwrite zs bufRef input = do
set_avail_in zs input (V.length input)
zloop zs bufRef []
zloop zs bufRef acc = do
oavail :: CUInt <- withForeignPtr zs $ \ ps -> do
throwZlibIfMinus_ (deflate ps (0))
{-# LINE 158 "Z/IO/BIO/Zlib.hsc" #-}
((\hsc_ptr -> peekByteOff hsc_ptr 32)) ps
{-# LINE 159 "Z/IO/BIO/Zlib.hsc" #-}
if oavail == 0
then do
oarr <- A.unsafeFreezeArr =<< readIORef bufRef
buf' <- A.newPinnedPrimArray bufSiz
set_avail_out zs buf' bufSiz
writeIORef bufRef buf'
zloop zs bufRef (V.PrimVector oarr 0 bufSiz : acc)
else do
let output = V.concat (List.reverse acc)
if V.null output then return Nothing
else return (Just output)
zflush finRef zs bufRef acc = do
fin <- readIORef finRef
if fin
then return Nothing
else do
buf <- readIORef bufRef
(r, osiz) <- withForeignPtr zs $ \ ps -> do
r <- throwZlibIfMinus (deflate ps (4))
{-# LINE 179 "Z/IO/BIO/Zlib.hsc" #-}
oavail :: CUInt <- ((\hsc_ptr -> peekByteOff hsc_ptr 32)) ps
{-# LINE 180 "Z/IO/BIO/Zlib.hsc" #-}
return (r, bufSiz - fromIntegral oavail)
if (r /= (1) && osiz /= 0)
{-# LINE 182 "Z/IO/BIO/Zlib.hsc" #-}
then do
oarr <- A.unsafeFreezeArr buf
buf' <- A.newPinnedPrimArray bufSiz
set_avail_out zs buf' bufSiz
writeIORef bufRef buf'
zflush finRef zs bufRef (V.PrimVector oarr 0 osiz : acc)
else do
oarr <- A.unsafeFreezeArr buf
let trailing = V.concat . List.reverse $ V.PrimVector oarr 0 osiz : acc
writeIORef finRef True
if V.null trailing then return Nothing else return (Just trailing)
compressReset :: ZStream -> IO ()
compressReset (ZStream fp finRef) = do
throwZlibIfMinus_ (withForeignPtr fp deflateReset)
writeIORef finRef False
compress :: HasCallStack => CompressConfig -> V.Bytes -> V.Bytes
compress conf = V.concat . unsafeRunBlock (snd <$> newCompress conf)
compressBlocks :: HasCallStack => CompressConfig -> [V.Bytes] -> [V.Bytes]
compressBlocks conf = unsafeRunBlocks (snd <$> newCompress conf)
data DecompressConfig = DecompressConfig
{ decompressWindowBits :: WindowBits
, decompressDictionary :: V.Bytes
, decompressBufferSize :: Int
} deriving (Show, Eq, Ord, Generic)
deriving anyclass (Print, JSON)
defaultDecompressConfig :: DecompressConfig
defaultDecompressConfig = DecompressConfig defaultWindowBits V.empty V.defaultChunkSize
newDecompress :: DecompressConfig -> IO (ZStream, BIO V.Bytes V.Bytes)
newDecompress (DecompressConfig windowBits dict bufSiz) = do
zs <- newForeignPtr free_z_stream_inflate =<< create_z_stream
buf <- A.newPinnedPrimArray bufSiz
set_avail_out zs buf bufSiz
bufRef <- newIORef buf
withForeignPtr zs $ \ ps -> do
throwZlibIfMinus_ $ inflate_init2 ps windowBits
finRef <- newIORef False
return (ZStream zs finRef, BIO (zwrite zs bufRef) (zflush finRef zs bufRef []))
where
zwrite zs bufRef input = do
set_avail_in zs input (V.length input)
zloop zs bufRef []
zloop zs bufRef acc = do
oavail :: CUInt <- withForeignPtr zs $ \ ps -> do
r <- throwZlibIfMinus (inflate ps (0))
{-# LINE 240 "Z/IO/BIO/Zlib.hsc" #-}
when (r == (2)) $
{-# LINE 241 "Z/IO/BIO/Zlib.hsc" #-}
if V.null dict
then throwIO (ZlibException "Z_NEED_DICT" callStack)
else do
throwZlibIfMinus_ . withPrimVectorUnsafe dict $ \ pdict off len ->
inflate_set_dictionary ps pdict off (fromIntegral len)
throwZlibIfMinus_ (inflate ps (0))
{-# LINE 247 "Z/IO/BIO/Zlib.hsc" #-}
((\hsc_ptr -> peekByteOff hsc_ptr 32)) ps
{-# LINE 248 "Z/IO/BIO/Zlib.hsc" #-}
if oavail == 0
then do
oarr <- A.unsafeFreezeArr =<< readIORef bufRef
buf' <- A.newPinnedPrimArray bufSiz
set_avail_out zs buf' bufSiz
writeIORef bufRef buf'
zloop zs bufRef (V.PrimVector oarr 0 bufSiz : acc)
else do
let output = V.concat (List.reverse acc)
if V.null output then return Nothing
else return (Just output)
zflush finRef zs bufRef acc = do
fin <- readIORef finRef
if fin
then return Nothing
else do
buf <- readIORef bufRef
(r, osiz) <- withForeignPtr zs $ \ ps -> do
r <- throwZlibIfMinus (inflate ps (4))
{-# LINE 268 "Z/IO/BIO/Zlib.hsc" #-}
r' <- if r == (2)
{-# LINE 269 "Z/IO/BIO/Zlib.hsc" #-}
then if V.null dict
then throwIO (ZlibException "Z_NEED_DICT" callStack)
else do
throwZlibIfMinus_ . withPrimVectorUnsafe dict $ \ pdict off len ->
inflate_set_dictionary ps pdict off (fromIntegral len)
throwZlibIfMinus (inflate ps (4))
{-# LINE 275 "Z/IO/BIO/Zlib.hsc" #-}
else return r
oavail :: CUInt <- ((\hsc_ptr -> peekByteOff hsc_ptr 32)) ps
{-# LINE 277 "Z/IO/BIO/Zlib.hsc" #-}
return (r', bufSiz - fromIntegral oavail)
if (r /= (1) && osiz /= 0)
{-# LINE 279 "Z/IO/BIO/Zlib.hsc" #-}
then do
oarr <- A.unsafeFreezeArr buf
buf' <- A.newPinnedPrimArray bufSiz
set_avail_out zs buf' bufSiz
writeIORef bufRef buf'
zflush finRef zs bufRef (V.PrimVector oarr 0 osiz : acc)
else do
oarr <- A.unsafeFreezeArr buf
let trailing = V.concat . List.reverse $ V.PrimVector oarr 0 osiz : acc
writeIORef finRef True
if V.null trailing then return Nothing else return (Just trailing)
decompressReset :: ZStream -> IO ()
decompressReset (ZStream fp finRef) = do
throwZlibIfMinus_ (withForeignPtr fp inflateReset)
writeIORef finRef False
decompress :: HasCallStack => DecompressConfig -> V.Bytes -> V.Bytes
decompress conf = V.concat . unsafeRunBlock (snd <$> newDecompress conf)
decompressBlocks :: HasCallStack => DecompressConfig -> [V.Bytes] -> [V.Bytes]
decompressBlocks conf = unsafeRunBlocks (snd <$> newDecompress conf)
toZErrorMsg :: CInt -> CBytes
toZErrorMsg (0) = "Z_OK"
{-# LINE 310 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg (1) = "Z_STREAM_END"
{-# LINE 311 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg (2) = "Z_NEED_DICT"
{-# LINE 312 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg (-1) = "Z_ERRNO"
{-# LINE 313 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg (-2) = "Z_STREAM_ERROR"
{-# LINE 314 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg (-3) = "Z_DATA_ERROR"
{-# LINE 315 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg (-4) = "Z_MEM_ERROR"
{-# LINE 316 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg (-5) = "Z_BUF_ERROR"
{-# LINE 317 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg (-6) = "Z_VERSION_ERROR"
{-# LINE 318 "Z/IO/BIO/Zlib.hsc" #-}
toZErrorMsg _ = "Z_UNEXPECTED"
data ZlibException = ZlibException CBytes CallStack deriving Show
instance Exception ZlibException where
toException = ioExceptionToException
fromException = ioExceptionFromException
throwZlibIfMinus :: HasCallStack => IO CInt -> IO CInt
throwZlibIfMinus f = do
r <- f
if r < 0 && r /= (-5)
{-# LINE 330 "Z/IO/BIO/Zlib.hsc" #-}
then throwIO (ZlibException (toZErrorMsg r) callStack)
else return r
throwZlibIfMinus_ :: HasCallStack => IO CInt -> IO ()
throwZlibIfMinus_ = void . throwZlibIfMinus
foreign import ccall unsafe
create_z_stream :: IO (Ptr ZStream)
foreign import ccall unsafe "hs_zlib.c &free_z_stream_inflate"
free_z_stream_inflate :: FunPtr (Ptr ZStream -> IO ())
foreign import ccall unsafe "hs_zlib.c &free_z_stream_deflate"
free_z_stream_deflate :: FunPtr (Ptr ZStream -> IO ())
foreign import ccall unsafe
deflate_init2 :: Ptr ZStream -> CompressLevel -> WindowBits -> MemLevel -> Strategy -> IO CInt
foreign import ccall unsafe
deflate_set_dictionary :: Ptr ZStream -> BA# Word8 -> Int -> Int -> IO CInt
foreign import ccall unsafe
deflate :: Ptr ZStream -> CInt -> IO CInt
foreign import ccall unsafe
deflateReset :: Ptr ZStream -> IO CInt
foreign import ccall unsafe
inflate_init2 :: Ptr ZStream -> WindowBits -> IO CInt
foreign import ccall unsafe
inflate_set_dictionary :: Ptr ZStream -> BA# Word8 -> Int -> Int -> IO CInt
foreign import ccall unsafe
inflate :: Ptr ZStream -> CInt -> IO CInt
foreign import ccall unsafe
inflateReset :: Ptr ZStream -> IO CInt
set_avail_in :: ForeignPtr ZStream -> V.Bytes -> Int -> IO ()
set_avail_in zs buf buflen = do
withPrimVectorSafe buf $ \ pbuf _ ->
withForeignPtr zs $ \ ps -> do
((\hsc_ptr -> pokeByteOff hsc_ptr 0)) ps pbuf
{-# LINE 374 "Z/IO/BIO/Zlib.hsc" #-}
((\hsc_ptr -> pokeByteOff hsc_ptr 8)) ps (fromIntegral buflen :: CUInt)
{-# LINE 375 "Z/IO/BIO/Zlib.hsc" #-}
set_avail_out :: ForeignPtr ZStream -> MutablePrimArray RealWorld Word8 -> Int -> IO ()
set_avail_out zs buf bufSiz = do
withMutablePrimArrayContents buf $ \ pbuf ->
withForeignPtr zs $ \ ps -> do
((\hsc_ptr -> pokeByteOff hsc_ptr 24)) ps pbuf
{-# LINE 381 "Z/IO/BIO/Zlib.hsc" #-}
((\hsc_ptr -> pokeByteOff hsc_ptr 32)) ps (fromIntegral bufSiz :: CUInt)
{-# LINE 382 "Z/IO/BIO/Zlib.hsc" #-}