Safe Haskell | None |
---|---|
Language | Haskell98 |
System.ZMQ4.Internal
Description
Warning: This is an internal module and subject to change without notice.
Synopsis
- newtype Context = Context {}
- newtype Socket a = Socket {}
- data SocketRepr = SocketRepr {}
- class SocketType a where
- zmqSocketType :: a -> ZMQSocketType
- class SocketLike (s :: Type -> Type) where
- newtype Message = Message {}
- data Flag
- type Timeout = Int64
- type Size = Word
- data Switch
- data EventType
- data EventMsg
- = Connected !ByteString !Fd
- | ConnectDelayed !ByteString
- | ConnectRetried !ByteString !Int
- | Listening !ByteString !Fd
- | BindFailed !ByteString !Int
- | Accepted !ByteString !Fd
- | AcceptFailed !ByteString !Int
- | Closed !ByteString !Fd
- | CloseFailed !ByteString !Int
- | Disconnected !ByteString !Fd
- | MonitorStopped !ByteString !Int
- data SecurityMechanism
- data KeyFormat a where
- messageOf :: ByteString -> IO Message
- messageOfLazy :: ByteString -> IO Message
- messageClose :: Message -> IO ()
- messageFree :: Message -> IO ()
- messageInit :: IO Message
- messageInitSize :: Size -> IO Message
- setIntOpt :: (Storable b, Integral b) => Socket a -> ZMQOption -> b -> IO ()
- setStrOpt :: Socket a -> ZMQOption -> String -> IO ()
- getIntOpt :: (Storable b, Integral b) => Socket a -> ZMQOption -> b -> IO b
- getStrOpt :: Socket a -> ZMQOption -> IO String
- getInt32Option :: ZMQOption -> Socket a -> IO Int
- setInt32OptFromRestricted :: Integral i => ZMQOption -> Restricted r i -> Socket b -> IO ()
- ctxIntOption :: Integral i => String -> ZMQCtxOption -> Context -> IO i
- setCtxIntOption :: Integral i => String -> ZMQCtxOption -> i -> Context -> IO ()
- getBytesOpt :: Socket a -> ZMQOption -> IO ByteString
- getByteStringOpt :: Socket a -> ZMQOption -> IO ByteString
- setByteStringOpt :: Socket a -> ZMQOption -> ByteString -> IO ()
- z85Encode :: MonadIO m => Restricted Div4 ByteString -> m ByteString
- z85Decode :: MonadIO m => Restricted Div5 ByteString -> m ByteString
- toZMQFlag :: Flag -> ZMQFlag
- combine :: (Integral i, Bits i) => [i] -> i
- combineFlags :: [Flag] -> CInt
- mkSocketRepr :: SocketType t => t -> Context -> IO SocketRepr
- closeSock :: SocketRepr -> IO ()
- onSocket :: String -> Socket a -> (ZMQSocket -> IO b) -> IO b
- bool2cint :: Bool -> CInt
- toSwitch :: (Show a, Integral a) => String -> a -> Switch
- fromSwitch :: Integral a => Switch -> a
- events2cint :: [EventType] -> CInt
- eventMessage :: ByteString -> ZMQEvent -> EventMsg
- toMechanism :: SecurityMechanism -> ZMQSecMechanism
- fromMechanism :: String -> Int -> SecurityMechanism
- getKey :: KeyFormat f -> Socket a -> ZMQOption -> IO ByteString
Documentation
data SocketRepr Source #
class SocketType a where Source #
Socket types.
Methods
zmqSocketType :: a -> ZMQSocketType Source #
Instances
class SocketLike (s :: Type -> Type) where Source #
Instances
Flags to apply on send operations (cf. man zmq_send)
Event types to monitor.
Constructors
ConnectedEvent | |
ConnectDelayedEvent | |
ConnectRetriedEvent | |
ListeningEvent | |
BindFailedEvent | |
AcceptedEvent | |
AcceptFailedEvent | |
ClosedEvent | |
CloseFailedEvent | |
DisconnectedEvent | |
MonitorStoppedEvent | |
AllEvents |
Instances
Show EventType Source # | |
Eq EventType Source # | |
Ord EventType Source # | |
Event Message to receive when monitoring socket events.
Constructors
Instances
data SecurityMechanism Source #
Instances
Show SecurityMechanism Source # | |
Defined in System.ZMQ4.Internal Methods showsPrec :: Int -> SecurityMechanism -> ShowS # show :: SecurityMechanism -> String # showList :: [SecurityMechanism] -> ShowS # | |
Eq SecurityMechanism Source # | |
Defined in System.ZMQ4.Internal Methods (==) :: SecurityMechanism -> SecurityMechanism -> Bool # (/=) :: SecurityMechanism -> SecurityMechanism -> Bool # |
data KeyFormat a where Source #
Constructors
BinaryFormat :: KeyFormat Div4 | |
TextFormat :: KeyFormat Div5 |
messageOfLazy :: ByteString -> IO Message Source #
messageClose :: Message -> IO () Source #
messageFree :: Message -> IO () Source #
messageInit :: IO Message Source #
setInt32OptFromRestricted :: Integral i => ZMQOption -> Restricted r i -> Socket b -> IO () Source #
ctxIntOption :: Integral i => String -> ZMQCtxOption -> Context -> IO i Source #
setCtxIntOption :: Integral i => String -> ZMQCtxOption -> i -> Context -> IO () Source #
getBytesOpt :: Socket a -> ZMQOption -> IO ByteString Source #
getByteStringOpt :: Socket a -> ZMQOption -> IO ByteString Source #
setByteStringOpt :: Socket a -> ZMQOption -> ByteString -> IO () Source #
z85Encode :: MonadIO m => Restricted Div4 ByteString -> m ByteString Source #
z85Decode :: MonadIO m => Restricted Div5 ByteString -> m ByteString Source #
combineFlags :: [Flag] -> CInt Source #
mkSocketRepr :: SocketType t => t -> Context -> IO SocketRepr Source #
closeSock :: SocketRepr -> IO () Source #
fromSwitch :: Integral a => Switch -> a Source #
events2cint :: [EventType] -> CInt Source #
eventMessage :: ByteString -> ZMQEvent -> EventMsg Source #
fromMechanism :: String -> Int -> SecurityMechanism Source #