Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data GammaLinearT c m a
- runGammaLinearT :: RGB c => NonEmpty (TimeOfDay, c) -> GammaLinearT c m a -> m a
- data Time = Hour :. Minute
- data Hour
- data Minute
- (==>) :: RGB c => Time -> c -> (TimeOfDay, c)
- data NonEmpty a = a :| [a]
- calculateRGB :: Monad m => (Rational -> c -> c -> c) -> LocalTime -> GammaLinearT c m c
- weightedAverageTrichromaticity :: Rational -> Trichromaticity -> Trichromaticity -> Trichromaticity
Documentation
data GammaLinearT c m a Source #
Instances
runGammaLinearT :: RGB c => NonEmpty (TimeOfDay, c) -> GammaLinearT c m a -> m a Source #
Instances
Bounded Time Source # | |
Enum Time Source # | |
Eq Time Source # | |
Ord Time Source # | |
Read Time Source # | |
Show Time Source # | |
Generic Time Source # | |
NFData Time Source # | |
Defined in Blucontrol.Gamma.Linear | |
type Rep Time Source # | |
Defined in Blucontrol.Gamma.Linear type Rep Time = D1 ('MetaData "Time" "Blucontrol.Gamma.Linear" "blucontrol-0.3.0.0-inplace" 'False) (C1 ('MetaCons ":." ('InfixI 'NotAssociative 7) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Hour) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Minute))) |
Instances
Bounded Hour Source # | |
Enum Hour Source # | |
Eq Hour Source # | |
Integral Hour Source # | |
Num Hour Source # | |
Ord Hour Source # | |
Read Hour Source # | |
Real Hour Source # | |
Defined in Blucontrol.Gamma.Linear toRational :: Hour -> Rational # | |
Show Hour Source # | |
Generic Hour Source # | |
NFData Hour Source # | |
Defined in Blucontrol.Gamma.Linear | |
type Rep Hour Source # | |
Defined in Blucontrol.Gamma.Linear |
Instances
Bounded Minute Source # | |
Enum Minute Source # | |
Defined in Blucontrol.Gamma.Linear | |
Eq Minute Source # | |
Integral Minute Source # | |
Defined in Blucontrol.Gamma.Linear | |
Num Minute Source # | |
Ord Minute Source # | |
Read Minute Source # | |
Real Minute Source # | |
Defined in Blucontrol.Gamma.Linear toRational :: Minute -> Rational # | |
Show Minute Source # | |
Generic Minute Source # | |
NFData Minute Source # | |
Defined in Blucontrol.Gamma.Linear | |
type Rep Minute Source # | |
Defined in Blucontrol.Gamma.Linear |
Non-empty (and non-strict) list type.
Since: base-4.9.0.0
a :| [a] infixr 5 |
Instances
Monad NonEmpty | Since: base-4.9.0.0 |
Functor NonEmpty | Since: base-4.9.0.0 |
MonadFix NonEmpty | Since: base-4.9.0.0 |
Defined in Control.Monad.Fix | |
Applicative NonEmpty | Since: base-4.9.0.0 |
Foldable NonEmpty | Since: base-4.9.0.0 |
Defined in Data.Foldable fold :: Monoid m => NonEmpty m -> m # foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m # foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m # foldr :: (a -> b -> b) -> b -> NonEmpty a -> b # foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b # foldl :: (b -> a -> b) -> b -> NonEmpty a -> b # foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b # foldr1 :: (a -> a -> a) -> NonEmpty a -> a # foldl1 :: (a -> a -> a) -> NonEmpty a -> a # elem :: Eq a => a -> NonEmpty a -> Bool # maximum :: Ord a => NonEmpty a -> a # minimum :: Ord a => NonEmpty a -> a # | |
Traversable NonEmpty | Since: base-4.9.0.0 |
Eq1 NonEmpty | Since: base-4.10.0.0 |
Ord1 NonEmpty | Since: base-4.10.0.0 |
Defined in Data.Functor.Classes | |
Read1 NonEmpty | Since: base-4.10.0.0 |
Defined in Data.Functor.Classes | |
Show1 NonEmpty | Since: base-4.10.0.0 |
NFData1 NonEmpty | Since: deepseq-1.4.3.0 |
Defined in Control.DeepSeq | |
Lift a => Lift (NonEmpty a :: Type) | Since: template-haskell-2.15.0.0 |
IsList (NonEmpty a) | Since: base-4.9.0.0 |
Eq a => Eq (NonEmpty a) | Since: base-4.9.0.0 |
Ord a => Ord (NonEmpty a) | Since: base-4.9.0.0 |
Read a => Read (NonEmpty a) | Since: base-4.11.0.0 |
Show a => Show (NonEmpty a) | Since: base-4.11.0.0 |
Generic (NonEmpty a) | Since: base-4.6.0.0 |
Semigroup (NonEmpty a) | Since: base-4.9.0.0 |
NFData a => NFData (NonEmpty a) | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
Generic1 NonEmpty | Since: base-4.6.0.0 |
type Rep (NonEmpty a) | |
Defined in GHC.Generics type Rep (NonEmpty a) = D1 ('MetaData "NonEmpty" "GHC.Base" "base" 'False) (C1 ('MetaCons ":|" ('InfixI 'LeftAssociative 9) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a]))) | |
type Item (NonEmpty a) | |
type Rep1 NonEmpty | |
Defined in GHC.Generics type Rep1 NonEmpty = D1 ('MetaData "NonEmpty" "GHC.Base" "base" 'False) (C1 ('MetaCons ":|" ('InfixI 'LeftAssociative 9) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 []))) |
calculateRGB :: Monad m => (Rational -> c -> c -> c) -> LocalTime -> GammaLinearT c m c Source #