riak-protobuf-0.24.0.0: Haskell types for the Riak protocol buffer API

Safe HaskellNone
LanguageHaskell98

Network.Riak.Protocol.TsCell

Documentation

data TsCell Source #

Instances
Eq TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Methods

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

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

Data TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TsCell -> c TsCell #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TsCell #

toConstr :: TsCell -> Constr #

dataTypeOf :: TsCell -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TsCell) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TsCell) #

gmapT :: (forall b. Data b => b -> b) -> TsCell -> TsCell #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TsCell -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TsCell -> r #

gmapQ :: (forall d. Data d => d -> u) -> TsCell -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TsCell -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TsCell -> m TsCell #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TsCell -> m TsCell #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TsCell -> m TsCell #

Ord TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Show TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Generic TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Associated Types

type Rep TsCell :: Type -> Type #

Methods

from :: TsCell -> Rep TsCell x #

to :: Rep TsCell x -> TsCell #

GPB TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Wire TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

TextMsg TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Methods

textPut :: TsCell -> Output #

textGet :: Stream s Identity Char => Parsec s () TsCell #

TextType TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Methods

tellT :: String -> TsCell -> Output #

getT :: Stream s Identity Char => String -> Parsec s () TsCell #

ReflectDescriptor TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Mergeable TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Default TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

MessageAPI msg' (msg' -> TsCell) TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

Methods

getVal :: msg' -> (msg' -> TsCell) -> TsCell #

isSet :: msg' -> (msg' -> TsCell) -> Bool #

type Rep TsCell Source # 
Instance details

Defined in Network.Riak.Protocol.TsCell

type Rep TsCell = D1 (MetaData "TsCell" "Network.Riak.Protocol.TsCell" "riak-protobuf-0.24.0.0-h3U4wTYEK14nKJTHzPAva" False) (C1 (MetaCons "TsCell" PrefixI True) ((S1 (MetaSel (Just "varchar_value") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ByteString)) :*: S1 (MetaSel (Just "sint64_value") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int64))) :*: (S1 (MetaSel (Just "timestamp_value") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int64)) :*: (S1 (MetaSel (Just "boolean_value") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "double_value") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Double))))))