blucontrol-0.3.1.0: Configurable blue light filter
Safe HaskellNone
LanguageHaskell2010

Blucontrol.Control.Wait

Documentation

data ControlWaitT m a Source #

Instances

Instances details
MonadTrans ControlWaitT Source # 
Instance details

Defined in Blucontrol.Control.Wait

Methods

lift :: Monad m => m a -> ControlWaitT m a #

MonadTransControl ControlWaitT Source # 
Instance details

Defined in Blucontrol.Control.Wait

Associated Types

type StT ControlWaitT a #

Methods

liftWith :: Monad m => (Run ControlWaitT -> m a) -> ControlWaitT m a #

restoreT :: Monad m => m (StT ControlWaitT a) -> ControlWaitT m a #

MonadBase b m => MonadBase b (ControlWaitT m) Source # 
Instance details

Defined in Blucontrol.Control.Wait

Methods

liftBase :: b α -> ControlWaitT m α #

MonadBaseControl b m => MonadBaseControl b (ControlWaitT m) Source # 
Instance details

Defined in Blucontrol.Control.Wait

Associated Types

type StM (ControlWaitT m) a #

Methods

liftBaseWith :: (RunInBase (ControlWaitT m) b -> b a) -> ControlWaitT m a #

restoreM :: StM (ControlWaitT m) a -> ControlWaitT m a #

Monad m => Monad (ControlWaitT m) Source # 
Instance details

Defined in Blucontrol.Control.Wait

Methods

(>>=) :: ControlWaitT m a -> (a -> ControlWaitT m b) -> ControlWaitT m b #

(>>) :: ControlWaitT m a -> ControlWaitT m b -> ControlWaitT m b #

return :: a -> ControlWaitT m a #

Functor m => Functor (ControlWaitT m) Source # 
Instance details

Defined in Blucontrol.Control.Wait

Methods

fmap :: (a -> b) -> ControlWaitT m a -> ControlWaitT m b #

(<$) :: a -> ControlWaitT m b -> ControlWaitT m a #

Applicative m => Applicative (ControlWaitT m) Source # 
Instance details

Defined in Blucontrol.Control.Wait

Methods

pure :: a -> ControlWaitT m a #

(<*>) :: ControlWaitT m (a -> b) -> ControlWaitT m a -> ControlWaitT m b #

liftA2 :: (a -> b -> c) -> ControlWaitT m a -> ControlWaitT m b -> ControlWaitT m c #

(*>) :: ControlWaitT m a -> ControlWaitT m b -> ControlWaitT m b #

(<*) :: ControlWaitT m a -> ControlWaitT m b -> ControlWaitT m a #

MonadBaseControl IO m => MonadControl (ControlWaitT m) Source # 
Instance details

Defined in Blucontrol.Control.Wait

Associated Types

type ControlConstraint (ControlWaitT m) a Source #

type StT ControlWaitT a Source # 
Instance details

Defined in Blucontrol.Control.Wait

type StM (ControlWaitT m) a Source # 
Instance details

Defined in Blucontrol.Control.Wait

type ControlConstraint (ControlWaitT m) _1 Source # 
Instance details

Defined in Blucontrol.Control.Wait

newtype ConfigWait Source #

Constructors

ConfigWait 

Instances

Instances details
Eq ConfigWait Source # 
Instance details

Defined in Blucontrol.Control.Wait

Ord ConfigWait Source # 
Instance details

Defined in Blucontrol.Control.Wait

Read ConfigWait Source # 
Instance details

Defined in Blucontrol.Control.Wait

Show ConfigWait Source # 
Instance details

Defined in Blucontrol.Control.Wait

Generic ConfigWait Source # 
Instance details

Defined in Blucontrol.Control.Wait

Associated Types

type Rep ConfigWait :: Type -> Type #

Default ConfigWait Source # 
Instance details

Defined in Blucontrol.Control.Wait

Methods

def :: ConfigWait #

NFData ConfigWait Source # 
Instance details

Defined in Blucontrol.Control.Wait

Methods

rnf :: ConfigWait -> () #

type Rep ConfigWait Source # 
Instance details

Defined in Blucontrol.Control.Wait

type Rep ConfigWait = D1 ('MetaData "ConfigWait" "Blucontrol.Control.Wait" "blucontrol-0.3.1.0-inplace" 'True) (C1 ('MetaCons "ConfigWait" 'PrefixI 'True) (S1 ('MetaSel ('Just "interval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Microseconds)))