{-# LANGUAGE ForeignFunctionInterface #-}
module Codec.Compression.SnappyC.Internal.C
(
snappy_compress
, snappy_max_compressed_length
, snappy_uncompress
, snappy_uncompressed_length
) where
import Foreign
import Foreign.C
foreign import ccall unsafe "snappy-c.h snappy_compress"
snappy_compress
:: CString
-> CSize
-> CString
-> Ptr CSize
-> CInt
foreign import ccall unsafe "snappy-c.h snappy_max_compressed_length"
snappy_max_compressed_length
:: CSize
-> CSize
foreign import ccall unsafe "snappy-c.h snappy_uncompress"
snappy_uncompress
:: CString
-> CSize
-> CString
-> Ptr CSize
-> CInt
foreign import ccall unsafe "snappy-c.h snappy_uncompressed_length"
snappy_uncompressed_length
:: CString
-> CSize
-> Ptr CSize
-> CInt