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

Safe HaskellNone
LanguageHaskell98

Network.Riak.Protocol.ModFun

Documentation

data ModFun Source #

Constructors

ModFun 

Instances

Eq ModFun Source # 

Methods

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

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

Data ModFun Source # 

Methods

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

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

toConstr :: ModFun -> Constr #

dataTypeOf :: ModFun -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ModFun Source # 
Show ModFun Source # 
Generic ModFun Source # 

Associated Types

type Rep ModFun :: * -> * #

Methods

from :: ModFun -> Rep ModFun x #

to :: Rep ModFun x -> ModFun #

GPB ModFun Source # 
Wire ModFun Source # 
TextMsg ModFun Source # 

Methods

textPut :: ModFun -> Output #

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

TextType ModFun Source # 

Methods

tellT :: String -> ModFun -> Output #

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

ReflectDescriptor ModFun Source # 
Mergeable ModFun Source # 
Default ModFun Source # 
MessageAPI msg' (msg' -> ModFun) ModFun Source # 

Methods

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

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

type Rep ModFun Source # 
type Rep ModFun = D1 (MetaData "ModFun" "Network.Riak.Protocol.ModFun" "riak-protobuf-0.23.0.0-65VzdVRbDm2E8AMd4lZWec" False) (C1 (MetaCons "ModFun" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "module'") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ByteString)) (S1 (MetaSel (Just Symbol "function") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ByteString))))