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

Pandora.Paradigm.Structure.Some.Binary

Documentation

left :: forall k1 k2 a (ct :: k1) (cu :: k2). a -> T_U ct cu (:*:) Maybe Maybe a Source #

right :: forall k1 k2 a (ct :: k1) (cu :: k2). a -> T_U ct cu (:*:) Maybe Maybe a Source #

both :: forall k1 k2 a (ct :: k1) (cu :: k2). a -> a -> T_U ct cu (:*:) Maybe Maybe a Source #

end :: forall k1 k2 (ct :: k1) (cu :: k2) a. T_U ct cu (:*:) Maybe Maybe a Source #

Orphan instances

Morphable ('Into Binary) (Construction (Maybe <:*:> Maybe)) Source # 
Instance details

Associated Types

type Morphing ('Into Binary) (Construction (Maybe <:*:> Maybe)) :: Type -> Type Source #

Chain k => Morphable ('Lookup ('Key :: a -> Morph a) :: Morph (a -> Morph a)) (Prefixed Binary k) Source # 
Instance details

Associated Types

type Morphing ('Lookup 'Key) (Prefixed Binary k) :: Type -> Type Source #

Chain key => Morphable ('Lookup ('Key :: a -> Morph a) :: Morph (a -> Morph a)) ((Prefixed < Construction (Maybe <:*:> Maybe)) < key) Source # 
Instance details

Associated Types

type Morphing ('Lookup 'Key) ((Prefixed < Construction (Maybe <:*:> Maybe)) < key) :: Type -> Type Source #

Substructure ('Right :: a -> Wye a) Binary Source # 
Instance details

Associated Types

type Substance 'Right Binary :: Type -> Type Source #

Substructure ('Left :: a -> Wye a) Binary Source # 
Instance details

Associated Types

type Substance 'Left Binary :: Type -> Type Source #

Substructure ('Root :: a -> Segment a) (Construction (Maybe <:*:> Maybe)) Source # 
Instance details

Associated Types

type Substance 'Root (Construction (Maybe <:*:> Maybe)) :: Type -> Type Source #

Substructure ('Right :: a -> Wye a) (Construction (Maybe <:*:> Maybe)) Source # 
Instance details

Associated Types

type Substance 'Right (Construction (Maybe <:*:> Maybe)) :: Type -> Type Source #

Substructure ('Left :: a -> Wye a) (Construction (Maybe <:*:> Maybe)) Source # 
Instance details

Associated Types

type Substance 'Left (Construction (Maybe <:*:> Maybe)) :: Type -> Type Source #