pandora-0.4.5: A box of patterns and paradigms
Safe HaskellSafe-Inferred
LanguageHaskell2010

Pandora.Paradigm.Primary.Algebraic.Sum

Documentation

data s :+: a infixr 0 Source #

Constructors

Option s 
Adoption a 

Instances

Instances details
Bivariant (:+:) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Algebraic.Sum

Methods

(<->) :: (a -> b) -> (c -> d) -> (a :+: c) -> (b :+: d) Source #

Semimonoidal Maybe ((->) :: Type -> Type -> Type) (:*:) (:+:) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Functor.Maybe

Methods

multiply_ :: forall (a :: k) (b :: k). (Maybe a :*: Maybe b) -> Maybe (a :+: b) Source #

Semimonoidal ((:+:) e :: Type -> Type) ((->) :: Type -> Type -> Type) (:*:) (:+:) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Algebraic

Methods

multiply_ :: forall (a :: k) (b :: k). ((e :+: a) :*: (e :+: b)) -> (e :+: (a :+: b)) Source #

Semigroup e => Semimonoidal (Validation e :: Type -> Type) ((->) :: Type -> Type -> Type) (:*:) (:+:) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Functor.Validation

Methods

multiply_ :: forall (a :: k) (b :: k). (Validation e a :*: Validation e b) -> Validation e (a :+: b) Source #

Semigroup e => Semimonoidal (Conclusion e :: Type -> Type) ((->) :: Type -> Type -> Type) (:*:) (:+:) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Functor.Conclusion

Methods

multiply_ :: forall (a :: k) (b :: k). (Conclusion e a :*: Conclusion e b) -> Conclusion e (a :+: b) Source #

Pointable ((:+:) e) ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Algebraic.Sum

Methods

point :: a -> (e :+: a) Source #

Covariant ((:+:) s) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Algebraic.Sum

Methods

(-<$>-) :: (a -> b) -> (s :+: a) -> (s :+: b) Source #

Covariant (Flip (:+:) a) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Algebraic.Sum

Methods

(-<$>-) :: (a0 -> b) -> Flip (:+:) a a0 -> Flip (:+:) a b Source #