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

Pandora.Paradigm.Structure.Ability.Zipper

Documentation

type family Zipper (structure :: * -> *) (moves :: k) = (result :: * -> *) | result -> structure Source #

Instances

Instances details
type Zipper List (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.List

type Zipper List (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) = Tap ((List <:.:> List) := (:*:))
type Zipper (Construction Identity) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.Stream

type Zipper (Construction Identity) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) = Tap ((Stream <:.:> Stream) := (:*:))
type Zipper (Comprehension Maybe) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.List

type Zipper (Comprehension Maybe) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) = Tap ((Comprehension Maybe <:.:> Comprehension Maybe) := (:*:))
type Zipper (Construction Maybe) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.List

type Zipper (Construction Maybe) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) = Tap ((Construction Maybe <:.:> Construction Maybe) := (:*:))
type Zipper (Construction Wye) (('Up :: a1 -> Vertical a1) ::: ('Down ('Left :: a2 -> Wye a2) ::: 'Down ('Right :: a3 -> Wye a3) :: k2 -> k'2 -> Type) :: k1 -> k'1 -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.Binary

type Zipper (Construction Wye) (('Up :: a1 -> Vertical a1) ::: ('Down ('Left :: a2 -> Wye a2) ::: 'Down ('Right :: a3 -> Wye a3) :: k2 -> k'2 -> Type) :: k1 -> k'1 -> Type) = (Construction Wye <:.:> (Bifurcation <:.> Bicursor)) := (:*:)

type family Fastenable structure rs where ... Source #

Equations

Fastenable structure (r ::: rs) = (Morphable (Rotate r) structure, Fastenable structure rs) 
Fastenable structure r = Morphable (Rotate r) structure