haskakafka-1.0.0: Kafka bindings for Haskell

Safe HaskellNone

Haskakafka.InternalRdKafka

Documentation

type CInt64T = CLongSource

type CInt32T = CIntSource

type CFilePtr = Ptr CFileSource

type CSizePtr = Ptr CSizeSource

type Word8Ptr = Ptr Word8Source

type CCharBufPointer = Ptr CCharSource

type RdKafkaTPtr = ForeignPtr RdKafkaTSource

rdKafkaConfDestroy :: FunPtr (Ptr RdKafkaConfT -> IO ())Source

rdKafkaConfSet :: RdKafkaConfTPtr -> String -> String -> CCharBufPointer -> CSize -> IO RdKafkaConfResTSource

rdKafkaConfDumpFree :: Ptr CString -> CSize -> IO ()Source

rdKafkaDestroy :: FunPtr (Ptr RdKafkaT -> IO ())Source

rdKafkaBrokersAdd :: RdKafkaTPtr -> String -> IO IntSource

rdKafkaConsumeStart :: RdKafkaTopicTPtr -> Int -> Int64 -> IO (Maybe String)Source

rdKafkaConsumeBatch :: RdKafkaTopicTPtr -> CInt32T -> Int -> Ptr (Ptr RdKafkaMessageT) -> CSize -> IO CSizeSource

rdKafkaConsumeStop :: RdKafkaTopicTPtr -> Int -> IO (Maybe String)Source

rdKafkaProduce :: RdKafkaTopicTPtr -> CInt32T -> Int -> Word8Ptr -> CSize -> Word8Ptr -> CSize -> Word8Ptr -> IO IntSource

castMetadata :: Ptr (Ptr RdKafkaMetadataT) -> Ptr (Ptr ())Source

rdKafkaPoll :: RdKafkaTPtr -> Int -> IO IntSource

rdKafkaTopicDestroy :: FunPtr (Ptr RdKafkaTopicT -> IO ())Source

enumToCInt :: Enum a => a -> CIntSource

cIntToEnum :: Enum a => CInt -> aSource

cIntConv :: (Integral a, Num b) => a -> bSource

boolToCInt :: Bool -> CIntSource

fdopen :: Fd -> CString -> IO (Ptr CFile)Source

handleToCFile :: Handle -> String -> IO CFilePtrSource

rdKafkaErr2str'_ :: CInt -> Ptr CCharSource

rdKafkaErrno2err'_ :: CInt -> CIntSource

rdKafkaConfSet'_ :: Ptr RdKafkaConfT -> Ptr CChar -> Ptr CChar -> Ptr CChar -> CULong -> IO CIntSource

rdKafkaConfDump'_ :: Ptr RdKafkaConfT -> CSizePtr -> IO (Ptr (Ptr CChar))Source

rdKafkaConfDumpFree'_ :: Ptr (Ptr CChar) -> CULong -> IO ()Source

rdKafkaTopicConfSet'_ :: Ptr RdKafkaTopicConfT -> Ptr CChar -> Ptr CChar -> Ptr CChar -> CULong -> IO CIntSource

rdKafkaTopicConfDump'_ :: Ptr RdKafkaTopicConfT -> CSizePtr -> IO (Ptr (Ptr CChar))Source

rdKafkaNew'_ :: CInt -> Ptr RdKafkaConfT -> Ptr CChar -> CULong -> IO (Ptr RdKafkaT)Source

rdKafkaBrokersAdd'_ :: Ptr RdKafkaT -> Ptr CChar -> IO CIntSource

rdKafkaSetLogLevel'_ :: Ptr RdKafkaT -> CInt -> IO ()Source

rdKafkaConsumeStartInternal'_ :: Ptr RdKafkaTopicT -> CInt -> CLong -> IO CIntSource

rdKafkaConsume'_ :: Ptr RdKafkaTopicT -> CInt -> CInt -> IO (Ptr RdKafkaMessageT)Source

rdKafkaConsumeBatch'_ :: Ptr RdKafkaTopicT -> CInt -> CInt -> Ptr (Ptr RdKafkaMessageT) -> CULong -> IO CLongSource

rdKafkaOffsetStore'_ :: Ptr RdKafkaTopicT -> CInt -> CLong -> IO CIntSource

rdKafkaProduce'_ :: Ptr RdKafkaTopicT -> CInt -> CInt -> Ptr () -> CULong -> Ptr () -> CULong -> Ptr () -> IO CIntSource

rdKafkaProduceBatch'_ :: Ptr RdKafkaTopicT -> CInt -> CInt -> Ptr RdKafkaMessageT -> CInt -> IO CIntSource

rdKafkaMetadata'_ :: Ptr RdKafkaT -> CInt -> Ptr RdKafkaTopicT -> Ptr (Ptr ()) -> CInt -> IO CIntSource

rdKafkaPoll'_ :: Ptr RdKafkaT -> CInt -> IO CIntSource

rdKafkaTopicNew'_ :: Ptr RdKafkaT -> Ptr CChar -> Ptr RdKafkaTopicConfT -> IO (Ptr RdKafkaTopicT)Source