cloudi-1.7.0: Haskell CloudI API

Safe HaskellNone
LanguageHaskell2010

Foreign.CloudI

Documentation

data Response s Source #

Constructors

Response (ByteString, s, T s) 
ResponseInfo (ByteString, ByteString, s, T s) 
Forward (ByteString, ByteString, ByteString, s, T s) 
Forward_ (ByteString, ByteString, ByteString, Int, Int, s, T s) 
Null (s, T s) 
NullError (String, s, T s) 

Instances

Show s => Show (Response s) Source # 

Methods

showsPrec :: Int -> Response s -> ShowS #

show :: Response s -> String #

showList :: [Response s] -> ShowS #

type Callback s = RequestType -> ByteString -> ByteString -> ByteString -> ByteString -> Int -> Int -> ByteString -> Source -> s -> T s -> IO (Response s) Source #

data T s Source #

Instances

Show (T s) Source # 

Methods

showsPrec :: Int -> T s -> ShowS #

show :: T s -> String #

showList :: [T s] -> ShowS #

transIdNull :: ByteString Source #

api :: Typeable s => Int -> s -> IO (Result (T s)) Source #

threadCount :: IO (Result Int) Source #

subscribe :: T s -> ByteString -> Callback s -> IO (Result (T s)) Source #

subscribeCount :: Typeable s => T s -> ByteString -> IO (Result (Int, T s)) Source #

unsubscribe :: T s -> ByteString -> IO (Result (T s)) Source #

sendAsync :: Typeable s => T s -> ByteString -> ByteString -> Maybe Int -> Maybe ByteString -> Maybe Int -> IO (Result (ByteString, T s)) Source #

sendSync :: Typeable s => T s -> ByteString -> ByteString -> Maybe Int -> Maybe ByteString -> Maybe Int -> IO (Result (ByteString, ByteString, ByteString, T s)) Source #

mcastAsync :: Typeable s => T s -> ByteString -> ByteString -> Maybe Int -> Maybe ByteString -> Maybe Int -> IO (Result (Array Int ByteString, T s)) Source #

forward_ :: Typeable s => T s -> RequestType -> ByteString -> ByteString -> ByteString -> Int -> Int -> ByteString -> Source -> IO () Source #

forwardAsync :: Typeable s => T s -> ByteString -> ByteString -> ByteString -> Int -> Int -> ByteString -> Source -> IO () Source #

forwardSync :: Typeable s => T s -> ByteString -> ByteString -> ByteString -> Int -> Int -> ByteString -> Source -> IO () Source #

return_ :: Typeable s => T s -> RequestType -> ByteString -> ByteString -> ByteString -> ByteString -> Int -> ByteString -> Source -> IO () Source #

returnAsync :: Typeable s => T s -> ByteString -> ByteString -> ByteString -> ByteString -> Int -> ByteString -> Source -> IO () Source #

returnSync :: Typeable s => T s -> ByteString -> ByteString -> ByteString -> ByteString -> Int -> ByteString -> Source -> IO () Source #

recvAsync :: Typeable s => T s -> Maybe Int -> Maybe ByteString -> Maybe Bool -> IO (Result (ByteString, ByteString, ByteString, T s)) Source #

prefix :: T s -> ByteString Source #

poll :: Typeable s => T s -> Int -> IO (Result (Bool, T s)) Source #

threadCreate :: (Int -> IO ()) -> Int -> IO ThreadId Source #

infoKeyValueParse :: ByteString -> Map ByteString [ByteString] Source #