zre-0.1.0.1: ZRE protocol implementation

Safe HaskellNone
LanguageHaskell2010

Network.ZRE.Types

Contents

Documentation

isec :: Num a => a -> a Source #

sec :: RealFrac a => a -> Int Source #

msec :: RealFrac a => a -> Int Source #

newtype ZRE a Source #

Constructors

Z 

Instances

Monad ZRE Source # 

Methods

(>>=) :: ZRE a -> (a -> ZRE b) -> ZRE b #

(>>) :: ZRE a -> ZRE b -> ZRE b #

return :: a -> ZRE a #

fail :: String -> ZRE a #

Functor ZRE Source # 

Methods

fmap :: (a -> b) -> ZRE a -> ZRE b #

(<$) :: a -> ZRE b -> ZRE a #

Applicative ZRE Source # 

Methods

pure :: a -> ZRE a #

(<*>) :: ZRE (a -> b) -> ZRE a -> ZRE b #

liftA2 :: (a -> b -> c) -> ZRE a -> ZRE b -> ZRE c #

(*>) :: ZRE a -> ZRE b -> ZRE b #

(<*) :: ZRE a -> ZRE b -> ZRE a #

MonadIO ZRE Source # 

Methods

liftIO :: IO a -> ZRE a #

MonadBase IO ZRE Source # 

Methods

liftBase :: IO α -> ZRE α #

MonadBaseControl IO ZRE Source # 

Associated Types

type StM (ZRE :: * -> *) a :: * #

Methods

liftBaseWith :: (RunInBase ZRE IO -> IO a) -> ZRE a #

restoreM :: StM ZRE a -> ZRE a #

MonadReader (EventQueue, APIQueue) ZRE Source # 

Methods

ask :: ZRE (EventQueue, APIQueue) #

local :: ((EventQueue, APIQueue) -> (EventQueue, APIQueue)) -> ZRE a -> ZRE a #

reader :: ((EventQueue, APIQueue) -> a) -> ZRE a #

type StM ZRE a Source # 
type StM ZRE a = a

writeZ :: API -> ZRE () Source #

maybeM :: Monad m => m b -> (a -> m b) -> m (Maybe a) -> m b Source #

Orphan instances

Show a => Show (Async a) Source # 

Methods

showsPrec :: Int -> Async a -> ShowS #

show :: Async a -> String #

showList :: [Async a] -> ShowS #

Show a => Show (TBQueue a) Source # 

Methods

showsPrec :: Int -> TBQueue a -> ShowS #

show :: TBQueue a -> String #

showList :: [TBQueue a] -> ShowS #