blucontrol-0.5.1.1: Configurable blue light filter
Safe HaskellNone
LanguageHaskell2010

Blucontrol.Monad.Gamma.Const

Documentation

data GammaConstT c m a Source #

Instances

Instances details
MonadBase b m => MonadBase b (GammaConstT c m) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

Methods

liftBase :: b α -> GammaConstT c m α #

MonadBaseControl b m => MonadBaseControl b (GammaConstT c m) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

Associated Types

type StM (GammaConstT c m) a #

Methods

liftBaseWith :: (RunInBase (GammaConstT c m) b -> b a) -> GammaConstT c m a #

restoreM :: StM (GammaConstT c m) a -> GammaConstT c m a #

MonadTrans (GammaConstT c) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

Methods

lift :: Monad m => m a -> GammaConstT c m a #

MonadTransControl (GammaConstT c) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

Associated Types

type StT (GammaConstT c) a #

Methods

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

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

Monad m => Monad (GammaConstT c m) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

Methods

(>>=) :: GammaConstT c m a -> (a -> GammaConstT c m b) -> GammaConstT c m b #

(>>) :: GammaConstT c m a -> GammaConstT c m b -> GammaConstT c m b #

return :: a -> GammaConstT c m a #

Functor m => Functor (GammaConstT c m) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

Methods

fmap :: (a -> b) -> GammaConstT c m a -> GammaConstT c m b #

(<$) :: a -> GammaConstT c m b -> GammaConstT c m a #

Applicative m => Applicative (GammaConstT c m) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

Methods

pure :: a -> GammaConstT c m a #

(<*>) :: GammaConstT c m (a -> b) -> GammaConstT c m a -> GammaConstT c m b #

liftA2 :: (a -> b -> c0) -> GammaConstT c m a -> GammaConstT c m b -> GammaConstT c m c0 #

(*>) :: GammaConstT c m a -> GammaConstT c m b -> GammaConstT c m b #

(<*) :: GammaConstT c m a -> GammaConstT c m b -> GammaConstT c m a #

Monad m => MonadGamma (GammaConstT c m) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

Associated Types

type GammaValue (GammaConstT c m) Source #

type StT (GammaConstT c) a Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

type StT (GammaConstT c) a = StT (ReaderT c) a
type GammaValue (GammaConstT c m) Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

type GammaValue (GammaConstT c m) = c
type StM (GammaConstT c m) a Source # 
Instance details

Defined in Blucontrol.Monad.Gamma.Const

type StM (GammaConstT c m) a = StM (ReaderT c m) a

runGammaConstT :: c -> GammaConstT c m a -> m a Source #