-- GENERATED by C->Haskell Compiler, version 0.28.6 Switcheroo, 25 November 2017 (Haskell)
-- Edit the ORIGNAL .chs file instead!


{-# LINE 1 "src/Data/Digest/CRC32C/Internal.chs" #-}
module Data.Digest.CRC32C.Internal where
import qualified Foreign.C.Types as C2HSImp
import qualified Foreign.Ptr as C2HSImp
import qualified System.IO.Unsafe as C2HSImp





import Foreign.C
import Foreign.Ptr

lib_crc32c_extend :: CUInt -> Ptr CUChar -> CULong -> CUInt
lib_crc32c_extend :: CUInt -> Ptr CUChar -> CULong -> CUInt
lib_crc32c_extend = (\ CUInt
x1 Ptr CUChar
x2 CULong
x3 -> forall a. IO a -> a
C2HSImp.unsafePerformIO (CUInt -> Ptr CUChar -> CULong -> IO CUInt
crc32c_extend CUInt
x1 Ptr CUChar
x2 CULong
x3))
{-# LINE 9 "src/Data/Digest/CRC32C/Internal.chs" #-}


lib_crc32c_value :: Ptr CUChar -> CULong -> CUInt
lib_crc32c_value  = (\ x1 x2 -> C2HSImp.unsafePerformIO (crc32c_value x1 x2))
{-# LINE 9 "src/Data/Digest/CRC32C/Internal.chs" #-}

foreign import ccall safe "Data/Digest/CRC32C/Internal.chs.h crc32c_extend"
  crc32c_extend :: (C2HSImp.CUInt -> ((C2HSImp.Ptr C2HSImp.CUChar) -> (C2HSImp.CULong -> (IO C2HSImp.CUInt))))

foreign import ccall safe "Data/Digest/CRC32C/Internal.chs.h crc32c_value"
  crc32c_value :: ((C2HSImp.Ptr C2HSImp.CUChar) -> (C2HSImp.CULong -> (IO C2HSImp.CUInt)))