milena-0.5.2.1: A Kafka client for Haskell.

Safe HaskellNone
LanguageHaskell2010

Network.Kafka.Protocol

Contents

Synopsis

Documentation

class Serializable a where Source #

Minimal complete definition

serialize

Methods

serialize :: a -> Put Source #

Instances

Serializable Int8 Source # 

Methods

serialize :: Int8 -> Put Source #

Serializable Int16 Source # 

Methods

serialize :: Int16 -> Put Source #

Serializable Int32 Source # 

Methods

serialize :: Int32 -> Put Source #

Serializable Int64 Source # 

Methods

serialize :: Int64 -> Put Source #

Serializable Request Source # 
Serializable KafkaError Source # 
Serializable Metadata Source # 
Serializable ConsumerGroup Source # 
Serializable OffsetFetchRequest Source # 
Serializable OffsetCommitRequest Source # 
Serializable GroupCoordinatorRequest Source # 
Serializable Value Source # 

Methods

serialize :: Value -> Put Source #

Serializable Key Source # 

Methods

serialize :: Key -> Put Source #

Serializable Attributes Source # 
Serializable MagicByte Source # 
Serializable Crc Source # 

Methods

serialize :: Crc -> Put Source #

Serializable Message Source # 
Serializable Offset Source # 

Methods

serialize :: Offset -> Put Source #

Serializable MessageSetMember Source # 
Serializable MessageSet Source # 
Serializable Partition Source # 
Serializable Timeout Source # 
Serializable RequiredAcks Source # 
Serializable ProduceRequest Source # 
Serializable MaxBytes Source # 
Serializable MinBytes Source # 
Serializable MaxWaitTime Source # 
Serializable ReplicaId Source # 
Serializable FetchRequest Source # 
Serializable MaxNumberOfOffsets Source # 
Serializable Time Source # 

Methods

serialize :: Time -> Put Source #

Serializable OffsetRequest Source # 
Serializable Replicas Source # 
Serializable FetchResponse Source # 
Serializable ProduceResponse Source # 
Serializable KafkaString Source # 
Serializable KafkaBytes Source # 
Serializable TopicName Source # 
Serializable MetadataRequest Source # 
Serializable RequestMessage Source # 
Serializable ClientId Source # 
Serializable CorrelationId Source # 
Serializable ApiVersion Source # 
Serializable ApiKey Source # 

Methods

serialize :: ApiKey -> Put Source #

Serializable a => Serializable [a] Source # 

Methods

serialize :: [a] -> Put Source #

(Serializable a, Serializable b) => Serializable (a, b) Source # 

Methods

serialize :: (a, b) -> Put Source #

(Serializable a, Serializable b, Serializable c) => Serializable (a, b, c) Source # 

Methods

serialize :: (a, b, c) -> Put Source #

(Serializable a, Serializable b, Serializable c, Serializable d) => Serializable (a, b, c, d) Source # 

Methods

serialize :: (a, b, c, d) -> Put Source #

(Serializable a, Serializable b, Serializable c, Serializable d, Serializable e) => Serializable (a, b, c, d, e) Source # 

Methods

serialize :: (a, b, c, d, e) -> Put Source #

class Deserializable a where Source #

Minimal complete definition

deserialize

Methods

deserialize :: Get a Source #

Instances

Deserializable Int8 Source # 
Deserializable Int16 Source # 
Deserializable Int32 Source # 
Deserializable Int64 Source # 
Deserializable KafkaError Source # 
Deserializable Metadata Source # 
Deserializable ConsumerGroup Source # 
Deserializable Value Source # 
Deserializable Key Source # 
Deserializable Attributes Source # 
Deserializable MagicByte Source # 
Deserializable Crc Source # 
Deserializable Message Source # 
Deserializable Offset Source # 
Deserializable MessageSetMember Source # 
Deserializable MessageSet Source # 
Deserializable Partition Source # 
Deserializable Timeout Source # 
Deserializable RequiredAcks Source # 
Deserializable MaxBytes Source # 
Deserializable MinBytes Source # 
Deserializable MaxWaitTime Source # 
Deserializable ReplicaId Source # 
Deserializable FetchRequest Source # 
Deserializable OffsetFetchResponse Source # 
Deserializable OffsetCommitResponse Source # 
Deserializable Isr Source # 
Deserializable Replicas Source # 
Deserializable Leader Source # 
Deserializable PartitionMetadata Source # 
Deserializable TopicMetadata Source # 
Deserializable Port Source # 
Deserializable Host Source # 
Deserializable NodeId Source # 
Deserializable Broker Source # 
Deserializable MetadataResponse Source # 
Deserializable FetchResponse Source # 
Deserializable PartitionOffsets Source # 
Deserializable OffsetResponse Source # 
Deserializable ProduceResponse Source # 
Deserializable KafkaString Source # 
Deserializable KafkaBytes Source # 
Deserializable TopicName Source # 
Deserializable MetadataRequest Source # 
Deserializable ClientId Source # 
Deserializable CorrelationId Source # 
Deserializable ApiVersion Source # 
Deserializable ApiKey Source # 
Deserializable GroupCoordinatorResponse Source # 
Deserializable a => Deserializable [a] Source # 

Methods

deserialize :: Get [a] Source #

(Deserializable a, Deserializable b) => Deserializable (a, b) Source # 

Methods

deserialize :: Get (a, b) Source #

(Deserializable a, Deserializable b, Deserializable c) => Deserializable (a, b, c) Source # 

Methods

deserialize :: Get (a, b, c) Source #

(Deserializable a, Deserializable b, Deserializable c, Deserializable d) => Deserializable (a, b, c, d) Source # 

Methods

deserialize :: Get (a, b, c, d) Source #

(Deserializable a, Deserializable b, Deserializable c, Deserializable d, Deserializable e) => Deserializable (a, b, c, d, e) Source # 

Methods

deserialize :: Get (a, b, c, d, e) Source #

newtype ApiKey Source #

Constructors

ApiKey Int16 

Instances

Enum ApiKey Source # 
Eq ApiKey Source # 

Methods

(==) :: ApiKey -> ApiKey -> Bool #

(/=) :: ApiKey -> ApiKey -> Bool #

Integral ApiKey Source # 
Num ApiKey Source # 
Ord ApiKey Source # 
Real ApiKey Source # 
Show ApiKey Source # 
Generic ApiKey Source # 

Associated Types

type Rep ApiKey :: * -> * #

Methods

from :: ApiKey -> Rep ApiKey x #

to :: Rep ApiKey x -> ApiKey #

Deserializable ApiKey Source # 
Serializable ApiKey Source # 

Methods

serialize :: ApiKey -> Put Source #

type Rep ApiKey Source # 
type Rep ApiKey = D1 * (MetaData "ApiKey" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "ApiKey" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int16)))

newtype ApiVersion Source #

Constructors

ApiVersion Int16 

Instances

Enum ApiVersion Source # 
Eq ApiVersion Source # 
Integral ApiVersion Source # 
Num ApiVersion Source # 
Ord ApiVersion Source # 
Real ApiVersion Source # 
Show ApiVersion Source # 
Generic ApiVersion Source # 

Associated Types

type Rep ApiVersion :: * -> * #

Deserializable ApiVersion Source # 
Serializable ApiVersion Source # 
type Rep ApiVersion Source # 
type Rep ApiVersion = D1 * (MetaData "ApiVersion" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "ApiVersion" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int16)))

newtype CorrelationId Source #

Constructors

CorrelationId Int32 

Instances

Enum CorrelationId Source # 
Eq CorrelationId Source # 
Integral CorrelationId Source # 
Num CorrelationId Source # 
Ord CorrelationId Source # 
Real CorrelationId Source # 
Show CorrelationId Source # 
Generic CorrelationId Source # 

Associated Types

type Rep CorrelationId :: * -> * #

Deserializable CorrelationId Source # 
Serializable CorrelationId Source # 
type Rep CorrelationId Source # 
type Rep CorrelationId = D1 * (MetaData "CorrelationId" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "CorrelationId" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype ClientId Source #

Constructors

ClientId KafkaString 

Instances

data RequestMessage Source #

Instances

Eq RequestMessage Source # 
Show RequestMessage Source # 
Generic RequestMessage Source # 

Associated Types

type Rep RequestMessage :: * -> * #

Serializable RequestMessage Source # 
type Rep RequestMessage Source # 

newtype Broker Source #

Constructors

Broker 

Fields

Instances

Eq Broker Source # 

Methods

(==) :: Broker -> Broker -> Bool #

(/=) :: Broker -> Broker -> Bool #

Ord Broker Source # 
Show Broker Source # 
Generic Broker Source # 

Associated Types

type Rep Broker :: * -> * #

Methods

from :: Broker -> Rep Broker x #

to :: Rep Broker x -> Broker #

Deserializable Broker Source # 
type Rep Broker Source # 
type Rep Broker = D1 * (MetaData "Broker" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Broker" PrefixI True) (S1 * (MetaSel (Just Symbol "_brokerFields") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (NodeId, Host, Port))))

newtype NodeId Source #

Constructors

NodeId 

Fields

Instances

Enum NodeId Source # 
Eq NodeId Source # 

Methods

(==) :: NodeId -> NodeId -> Bool #

(/=) :: NodeId -> NodeId -> Bool #

Integral NodeId Source # 
Num NodeId Source # 
Ord NodeId Source # 
Real NodeId Source # 
Show NodeId Source # 
Generic NodeId Source # 

Associated Types

type Rep NodeId :: * -> * #

Methods

from :: NodeId -> Rep NodeId x #

to :: Rep NodeId x -> NodeId #

Deserializable NodeId Source # 
type Rep NodeId Source # 
type Rep NodeId = D1 * (MetaData "NodeId" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "NodeId" PrefixI True) (S1 * (MetaSel (Just Symbol "_nodeId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype Host Source #

Constructors

Host 

Instances

Eq Host Source # 

Methods

(==) :: Host -> Host -> Bool #

(/=) :: Host -> Host -> Bool #

Ord Host Source # 

Methods

compare :: Host -> Host -> Ordering #

(<) :: Host -> Host -> Bool #

(<=) :: Host -> Host -> Bool #

(>) :: Host -> Host -> Bool #

(>=) :: Host -> Host -> Bool #

max :: Host -> Host -> Host #

min :: Host -> Host -> Host #

Show Host Source # 

Methods

showsPrec :: Int -> Host -> ShowS #

show :: Host -> String #

showList :: [Host] -> ShowS #

IsString Host Source # 

Methods

fromString :: String -> Host #

Generic Host Source # 

Associated Types

type Rep Host :: * -> * #

Methods

from :: Host -> Rep Host x #

to :: Rep Host x -> Host #

Deserializable Host Source # 
type Rep Host Source # 
type Rep Host = D1 * (MetaData "Host" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Host" PrefixI True) (S1 * (MetaSel (Just Symbol "_hostKString") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * KafkaString)))

newtype Port Source #

Constructors

Port 

Fields

Instances

Enum Port Source # 

Methods

succ :: Port -> Port #

pred :: Port -> Port #

toEnum :: Int -> Port #

fromEnum :: Port -> Int #

enumFrom :: Port -> [Port] #

enumFromThen :: Port -> Port -> [Port] #

enumFromTo :: Port -> Port -> [Port] #

enumFromThenTo :: Port -> Port -> Port -> [Port] #

Eq Port Source # 

Methods

(==) :: Port -> Port -> Bool #

(/=) :: Port -> Port -> Bool #

Integral Port Source # 

Methods

quot :: Port -> Port -> Port #

rem :: Port -> Port -> Port #

div :: Port -> Port -> Port #

mod :: Port -> Port -> Port #

quotRem :: Port -> Port -> (Port, Port) #

divMod :: Port -> Port -> (Port, Port) #

toInteger :: Port -> Integer #

Num Port Source # 

Methods

(+) :: Port -> Port -> Port #

(-) :: Port -> Port -> Port #

(*) :: Port -> Port -> Port #

negate :: Port -> Port #

abs :: Port -> Port #

signum :: Port -> Port #

fromInteger :: Integer -> Port #

Ord Port Source # 

Methods

compare :: Port -> Port -> Ordering #

(<) :: Port -> Port -> Bool #

(<=) :: Port -> Port -> Bool #

(>) :: Port -> Port -> Bool #

(>=) :: Port -> Port -> Bool #

max :: Port -> Port -> Port #

min :: Port -> Port -> Port #

Real Port Source # 

Methods

toRational :: Port -> Rational #

Show Port Source # 

Methods

showsPrec :: Int -> Port -> ShowS #

show :: Port -> String #

showList :: [Port] -> ShowS #

Generic Port Source # 

Associated Types

type Rep Port :: * -> * #

Methods

from :: Port -> Rep Port x #

to :: Rep Port x -> Port #

Deserializable Port Source # 
type Rep Port Source # 
type Rep Port = D1 * (MetaData "Port" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Port" PrefixI True) (S1 * (MetaSel (Just Symbol "_portInt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype Leader Source #

Constructors

Leader 

Fields

Instances

Eq Leader Source # 

Methods

(==) :: Leader -> Leader -> Bool #

(/=) :: Leader -> Leader -> Bool #

Ord Leader Source # 
Show Leader Source # 
Generic Leader Source # 

Associated Types

type Rep Leader :: * -> * #

Methods

from :: Leader -> Rep Leader x #

to :: Rep Leader x -> Leader #

Deserializable Leader Source # 
type Rep Leader Source # 
type Rep Leader = D1 * (MetaData "Leader" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Leader" PrefixI True) (S1 * (MetaSel (Just Symbol "_leaderId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe Int32))))

newtype Replicas Source #

Constructors

Replicas [Int32] 

Instances

Eq Replicas Source # 
Show Replicas Source # 
Generic Replicas Source # 

Associated Types

type Rep Replicas :: * -> * #

Methods

from :: Replicas -> Rep Replicas x #

to :: Rep Replicas x -> Replicas #

Deserializable Replicas Source # 
Serializable Replicas Source # 
type Rep Replicas Source # 
type Rep Replicas = D1 * (MetaData "Replicas" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Replicas" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * [Int32])))

newtype Isr Source #

Constructors

Isr [Int32] 

Instances

Eq Isr Source # 

Methods

(==) :: Isr -> Isr -> Bool #

(/=) :: Isr -> Isr -> Bool #

Show Isr Source # 

Methods

showsPrec :: Int -> Isr -> ShowS #

show :: Isr -> String #

showList :: [Isr] -> ShowS #

Generic Isr Source # 

Associated Types

type Rep Isr :: * -> * #

Methods

from :: Isr -> Rep Isr x #

to :: Rep Isr x -> Isr #

Deserializable Isr Source # 
type Rep Isr Source # 
type Rep Isr = D1 * (MetaData "Isr" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Isr" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * [Int32])))

newtype Time Source #

Constructors

Time 

Fields

Instances

Bounded Time Source # 
Enum Time Source # 

Methods

succ :: Time -> Time #

pred :: Time -> Time #

toEnum :: Int -> Time #

fromEnum :: Time -> Int #

enumFrom :: Time -> [Time] #

enumFromThen :: Time -> Time -> [Time] #

enumFromTo :: Time -> Time -> [Time] #

enumFromThenTo :: Time -> Time -> Time -> [Time] #

Eq Time Source # 

Methods

(==) :: Time -> Time -> Bool #

(/=) :: Time -> Time -> Bool #

Integral Time Source # 

Methods

quot :: Time -> Time -> Time #

rem :: Time -> Time -> Time #

div :: Time -> Time -> Time #

mod :: Time -> Time -> Time #

quotRem :: Time -> Time -> (Time, Time) #

divMod :: Time -> Time -> (Time, Time) #

toInteger :: Time -> Integer #

Num Time Source # 

Methods

(+) :: Time -> Time -> Time #

(-) :: Time -> Time -> Time #

(*) :: Time -> Time -> Time #

negate :: Time -> Time #

abs :: Time -> Time #

signum :: Time -> Time #

fromInteger :: Integer -> Time #

Ord Time Source # 

Methods

compare :: Time -> Time -> Ordering #

(<) :: Time -> Time -> Bool #

(<=) :: Time -> Time -> Bool #

(>) :: Time -> Time -> Bool #

(>=) :: Time -> Time -> Bool #

max :: Time -> Time -> Time #

min :: Time -> Time -> Time #

Real Time Source # 

Methods

toRational :: Time -> Rational #

Show Time Source # 

Methods

showsPrec :: Int -> Time -> ShowS #

show :: Time -> String #

showList :: [Time] -> ShowS #

Generic Time Source # 

Associated Types

type Rep Time :: * -> * #

Methods

from :: Time -> Rep Time x #

to :: Rep Time x -> Time #

Serializable Time Source # 

Methods

serialize :: Time -> Put Source #

type Rep Time Source # 
type Rep Time = D1 * (MetaData "Time" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Time" PrefixI True) (S1 * (MetaSel (Just Symbol "_timeInt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int64)))

newtype MaxNumberOfOffsets Source #

Instances

Enum MaxNumberOfOffsets Source # 
Eq MaxNumberOfOffsets Source # 
Integral MaxNumberOfOffsets Source # 
Num MaxNumberOfOffsets Source # 
Ord MaxNumberOfOffsets Source # 
Real MaxNumberOfOffsets Source # 
Show MaxNumberOfOffsets Source # 
Generic MaxNumberOfOffsets Source # 
Serializable MaxNumberOfOffsets Source # 
type Rep MaxNumberOfOffsets Source # 
type Rep MaxNumberOfOffsets = D1 * (MetaData "MaxNumberOfOffsets" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "MaxNumberOfOffsets" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype ReplicaId Source #

Constructors

ReplicaId Int32 

Instances

Enum ReplicaId Source # 
Eq ReplicaId Source # 
Integral ReplicaId Source # 
Num ReplicaId Source # 
Ord ReplicaId Source # 
Real ReplicaId Source # 
Show ReplicaId Source # 
Generic ReplicaId Source # 

Associated Types

type Rep ReplicaId :: * -> * #

Deserializable ReplicaId Source # 
Serializable ReplicaId Source # 
type Rep ReplicaId Source # 
type Rep ReplicaId = D1 * (MetaData "ReplicaId" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "ReplicaId" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype MaxWaitTime Source #

Constructors

MaxWaitTime Int32 

Instances

Enum MaxWaitTime Source # 
Eq MaxWaitTime Source # 
Integral MaxWaitTime Source # 
Num MaxWaitTime Source # 
Ord MaxWaitTime Source # 
Real MaxWaitTime Source # 
Show MaxWaitTime Source # 
Generic MaxWaitTime Source # 

Associated Types

type Rep MaxWaitTime :: * -> * #

Deserializable MaxWaitTime Source # 
Serializable MaxWaitTime Source # 
type Rep MaxWaitTime Source # 
type Rep MaxWaitTime = D1 * (MetaData "MaxWaitTime" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "MaxWaitTime" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype MinBytes Source #

Constructors

MinBytes Int32 

Instances

Enum MinBytes Source # 
Eq MinBytes Source # 
Integral MinBytes Source # 
Num MinBytes Source # 
Ord MinBytes Source # 
Real MinBytes Source # 
Show MinBytes Source # 
Generic MinBytes Source # 

Associated Types

type Rep MinBytes :: * -> * #

Methods

from :: MinBytes -> Rep MinBytes x #

to :: Rep MinBytes x -> MinBytes #

Deserializable MinBytes Source # 
Serializable MinBytes Source # 
type Rep MinBytes Source # 
type Rep MinBytes = D1 * (MetaData "MinBytes" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "MinBytes" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype MaxBytes Source #

Constructors

MaxBytes Int32 

Instances

Enum MaxBytes Source # 
Eq MaxBytes Source # 
Integral MaxBytes Source # 
Num MaxBytes Source # 
Ord MaxBytes Source # 
Real MaxBytes Source # 
Show MaxBytes Source # 
Generic MaxBytes Source # 

Associated Types

type Rep MaxBytes :: * -> * #

Methods

from :: MaxBytes -> Rep MaxBytes x #

to :: Rep MaxBytes x -> MaxBytes #

Deserializable MaxBytes Source # 
Serializable MaxBytes Source # 
type Rep MaxBytes Source # 
type Rep MaxBytes = D1 * (MetaData "MaxBytes" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "MaxBytes" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype RequiredAcks Source #

Constructors

RequiredAcks Int16 

Instances

Enum RequiredAcks Source # 
Eq RequiredAcks Source # 
Integral RequiredAcks Source # 
Num RequiredAcks Source # 
Ord RequiredAcks Source # 
Real RequiredAcks Source # 
Show RequiredAcks Source # 
Generic RequiredAcks Source # 

Associated Types

type Rep RequiredAcks :: * -> * #

Deserializable RequiredAcks Source # 
Serializable RequiredAcks Source # 
type Rep RequiredAcks Source # 
type Rep RequiredAcks = D1 * (MetaData "RequiredAcks" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "RequiredAcks" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int16)))

newtype Timeout Source #

Constructors

Timeout Int32 

Instances

Enum Timeout Source # 
Eq Timeout Source # 

Methods

(==) :: Timeout -> Timeout -> Bool #

(/=) :: Timeout -> Timeout -> Bool #

Integral Timeout Source # 
Num Timeout Source # 
Ord Timeout Source # 
Real Timeout Source # 
Show Timeout Source # 
Generic Timeout Source # 

Associated Types

type Rep Timeout :: * -> * #

Methods

from :: Timeout -> Rep Timeout x #

to :: Rep Timeout x -> Timeout #

Deserializable Timeout Source # 
Serializable Timeout Source # 
type Rep Timeout Source # 
type Rep Timeout = D1 * (MetaData "Timeout" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Timeout" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype Partition Source #

Constructors

Partition Int32 

Instances

Enum Partition Source # 
Eq Partition Source # 
Integral Partition Source # 
Num Partition Source # 
Ord Partition Source # 
Real Partition Source # 
Show Partition Source # 
Generic Partition Source # 

Associated Types

type Rep Partition :: * -> * #

Deserializable Partition Source # 
Serializable Partition Source # 
type Rep Partition Source # 
type Rep Partition = D1 * (MetaData "Partition" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Partition" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype Offset Source #

Constructors

Offset Int64 

Instances

Enum Offset Source # 
Eq Offset Source # 

Methods

(==) :: Offset -> Offset -> Bool #

(/=) :: Offset -> Offset -> Bool #

Integral Offset Source # 
Num Offset Source # 
Ord Offset Source # 
Real Offset Source # 
Show Offset Source # 
Generic Offset Source # 

Associated Types

type Rep Offset :: * -> * #

Methods

from :: Offset -> Rep Offset x #

to :: Rep Offset x -> Offset #

Deserializable Offset Source # 
Serializable Offset Source # 

Methods

serialize :: Offset -> Put Source #

type Rep Offset Source # 
type Rep Offset = D1 * (MetaData "Offset" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Offset" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int64)))

newtype Message Source #

Constructors

Message 

Instances

Eq Message Source # 

Methods

(==) :: Message -> Message -> Bool #

(/=) :: Message -> Message -> Bool #

Show Message Source # 
Generic Message Source # 

Associated Types

type Rep Message :: * -> * #

Methods

from :: Message -> Rep Message x #

to :: Rep Message x -> Message #

Deserializable Message Source # 
Serializable Message Source # 
type Rep Message Source # 
type Rep Message = D1 * (MetaData "Message" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Message" PrefixI True) (S1 * (MetaSel (Just Symbol "_messageFields") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Crc, MagicByte, Attributes, Key, Value))))

data CompressionCodec Source #

Constructors

NoCompression 
Gzip 

Instances

Eq CompressionCodec Source # 
Show CompressionCodec Source # 
Generic CompressionCodec Source # 
type Rep CompressionCodec Source # 
type Rep CompressionCodec = D1 * (MetaData "CompressionCodec" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" False) ((:+:) * (C1 * (MetaCons "NoCompression" PrefixI False) (U1 *)) (C1 * (MetaCons "Gzip" PrefixI False) (U1 *)))

newtype Crc Source #

Constructors

Crc Int32 

Instances

Enum Crc Source # 

Methods

succ :: Crc -> Crc #

pred :: Crc -> Crc #

toEnum :: Int -> Crc #

fromEnum :: Crc -> Int #

enumFrom :: Crc -> [Crc] #

enumFromThen :: Crc -> Crc -> [Crc] #

enumFromTo :: Crc -> Crc -> [Crc] #

enumFromThenTo :: Crc -> Crc -> Crc -> [Crc] #

Eq Crc Source # 

Methods

(==) :: Crc -> Crc -> Bool #

(/=) :: Crc -> Crc -> Bool #

Integral Crc Source # 

Methods

quot :: Crc -> Crc -> Crc #

rem :: Crc -> Crc -> Crc #

div :: Crc -> Crc -> Crc #

mod :: Crc -> Crc -> Crc #

quotRem :: Crc -> Crc -> (Crc, Crc) #

divMod :: Crc -> Crc -> (Crc, Crc) #

toInteger :: Crc -> Integer #

Num Crc Source # 

Methods

(+) :: Crc -> Crc -> Crc #

(-) :: Crc -> Crc -> Crc #

(*) :: Crc -> Crc -> Crc #

negate :: Crc -> Crc #

abs :: Crc -> Crc #

signum :: Crc -> Crc #

fromInteger :: Integer -> Crc #

Ord Crc Source # 

Methods

compare :: Crc -> Crc -> Ordering #

(<) :: Crc -> Crc -> Bool #

(<=) :: Crc -> Crc -> Bool #

(>) :: Crc -> Crc -> Bool #

(>=) :: Crc -> Crc -> Bool #

max :: Crc -> Crc -> Crc #

min :: Crc -> Crc -> Crc #

Real Crc Source # 

Methods

toRational :: Crc -> Rational #

Show Crc Source # 

Methods

showsPrec :: Int -> Crc -> ShowS #

show :: Crc -> String #

showList :: [Crc] -> ShowS #

Generic Crc Source # 

Associated Types

type Rep Crc :: * -> * #

Methods

from :: Crc -> Rep Crc x #

to :: Rep Crc x -> Crc #

Deserializable Crc Source # 
Serializable Crc Source # 

Methods

serialize :: Crc -> Put Source #

type Rep Crc Source # 
type Rep Crc = D1 * (MetaData "Crc" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Crc" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int32)))

newtype MagicByte Source #

Constructors

MagicByte Int8 

Instances

Enum MagicByte Source # 
Eq MagicByte Source # 
Integral MagicByte Source # 
Num MagicByte Source # 
Ord MagicByte Source # 
Real MagicByte Source # 
Show MagicByte Source # 
Generic MagicByte Source # 

Associated Types

type Rep MagicByte :: * -> * #

Deserializable MagicByte Source # 
Serializable MagicByte Source # 
type Rep MagicByte Source # 
type Rep MagicByte = D1 * (MetaData "MagicByte" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "MagicByte" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int8)))

newtype Key Source #

Constructors

Key 

Instances

Eq Key Source # 

Methods

(==) :: Key -> Key -> Bool #

(/=) :: Key -> Key -> Bool #

Show Key Source # 

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String #

showList :: [Key] -> ShowS #

Generic Key Source # 

Associated Types

type Rep Key :: * -> * #

Methods

from :: Key -> Rep Key x #

to :: Rep Key x -> Key #

Deserializable Key Source # 
Serializable Key Source # 

Methods

serialize :: Key -> Put Source #

type Rep Key Source # 
type Rep Key = D1 * (MetaData "Key" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Key" PrefixI True) (S1 * (MetaSel (Just Symbol "_keyBytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe KafkaBytes))))

newtype Value Source #

Constructors

Value 

Instances

Eq Value Source # 

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Show Value Source # 

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Generic Value Source # 

Associated Types

type Rep Value :: * -> * #

Methods

from :: Value -> Rep Value x #

to :: Rep Value x -> Value #

Deserializable Value Source # 
Serializable Value Source # 

Methods

serialize :: Value -> Put Source #

type Rep Value Source # 
type Rep Value = D1 * (MetaData "Value" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Value" PrefixI True) (S1 * (MetaSel (Just Symbol "_valueBytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe KafkaBytes))))

data ResponseMessage Source #

Instances

Eq ResponseMessage Source # 
Show ResponseMessage Source # 
Generic ResponseMessage Source # 
type Rep ResponseMessage Source # 

newtype Metadata Source #

Constructors

Metadata KafkaString 

Instances

data KafkaError Source #

Constructors

NoError

0 No error--it worked!

Unknown

-1 An unexpected server error

OffsetOutOfRange

1 The requested offset is outside the range of offsets maintained by the server for the given topic/partition.

InvalidMessage

2 This indicates that a message contents does not match its CRC

UnknownTopicOrPartition

3 This request is for a topic or partition that does not exist on this broker.

InvalidMessageSize

4 The message has a negative size

LeaderNotAvailable

5 This error is thrown if we are in the middle of a leadership election and there is currently no leader for this partition and hence it is unavailable for writes.

NotLeaderForPartition

6 This error is thrown if the client attempts to send messages to a replica that is not the leader for some partition. It indicates that the clients metadata is out of date.

RequestTimedOut

7 This error is thrown if the request exceeds the user-specified time limit in the request.

BrokerNotAvailable

8 This is not a client facing error and is used mostly by tools when a broker is not alive.

ReplicaNotAvailable

9 If replica is expected on a broker, but is not.

MessageSizeTooLarge

10 The server has a configurable maximum message size to avoid unbounded memory allocation. This error is thrown if the client attempt to produce a message larger than this maximum.

StaleControllerEpochCode

11 Internal error code for broker-to-broker communication.

OffsetMetadataTooLargeCode

12 If you specify a string larger than configured maximum for offset metadata

OffsetsLoadInProgressCode

14 The broker returns this error code for an offset fetch request if it is still loading offsets (after a leader change for that offsets topic partition).

ConsumerCoordinatorNotAvailableCode

15 The broker returns this error code for consumer metadata requests or offset commit requests if the offsets topic has not yet been created.

NotCoordinatorForConsumerCode

16 The broker returns this error code if it receives an offset fetch or commit request for a consumer group that it is not a coordinator for.

Instances

Bounded KafkaError Source # 
Enum KafkaError Source # 
Eq KafkaError Source # 
Show KafkaError Source # 
Generic KafkaError Source # 

Associated Types

type Rep KafkaError :: * -> * #

Exception KafkaError Source # 
Deserializable KafkaError Source # 
Serializable KafkaError Source # 
type Rep KafkaError Source # 
type Rep KafkaError = D1 * (MetaData "KafkaError" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" False) ((:+:) * ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "NoError" PrefixI False) (U1 *)) (C1 * (MetaCons "Unknown" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "OffsetOutOfRange" PrefixI False) (U1 *)) (C1 * (MetaCons "InvalidMessage" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "UnknownTopicOrPartition" PrefixI False) (U1 *)) (C1 * (MetaCons "InvalidMessageSize" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "LeaderNotAvailable" PrefixI False) (U1 *)) (C1 * (MetaCons "NotLeaderForPartition" PrefixI False) (U1 *))))) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "RequestTimedOut" PrefixI False) (U1 *)) (C1 * (MetaCons "BrokerNotAvailable" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "ReplicaNotAvailable" PrefixI False) (U1 *)) (C1 * (MetaCons "MessageSizeTooLarge" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "StaleControllerEpochCode" PrefixI False) (U1 *)) (C1 * (MetaCons "OffsetMetadataTooLargeCode" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "OffsetsLoadInProgressCode" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "ConsumerCoordinatorNotAvailableCode" PrefixI False) (U1 *)) (C1 * (MetaCons "NotCoordinatorForConsumerCode" PrefixI False) (U1 *)))))))

newtype Request Source #

Instances

Eq Request Source # 

Methods

(==) :: Request -> Request -> Bool #

(/=) :: Request -> Request -> Bool #

Show Request Source # 
Generic Request Source # 

Associated Types

type Rep Request :: * -> * #

Methods

from :: Request -> Rep Request x #

to :: Rep Request x -> Request #

Serializable Request Source # 
type Rep Request Source # 
type Rep Request = D1 * (MetaData "Request" "Network.Kafka.Protocol" "milena-0.5.2.1-CzbqlSpIamgHO2b09V8tDC" True) (C1 * (MetaCons "Request" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (CorrelationId, ClientId, RequestMessage))))

Generated lenses

Composed lenses

keyed :: (Field1 a a b b, Choice p, Applicative f, Eq b) => b -> Optic' p f a a Source #