Deletable List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Stack List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Measurable 'Length List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Measurable 'Heighth Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Monotonic a ((Maybe <:.> Construction Maybe) := a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Extendable (Tap ((List <:.:> List) := (:*:))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Semigroup (List a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Monoid (List a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Setoid a => Setoid (List a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Nullable List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Nullable Rose Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
Nullable Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Focusable ('Root :: Type -> Location Type) Rose Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
(forall a. Chain a) => Focusable ('Root :: Type -> Location Type) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Focusable ('Head :: Type -> Location Type) List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Focusable ('Root :: Type -> Location Type) (Construction List) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
Morphable ('Into (o ds)) (Construction Wye) => Morphable ('Into (o ds) :: Morph a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
Morphable ('Into List) (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Morphable ('Into Binary) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Morphable ('Rotate ('Right :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((List <:.:> List) := (:*:))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Morphable ('Rotate ('Left :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((List <:.:> List) := (:*:))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Morphable ('Rotate ('Up :: a -> Vertical a) :: Morph (a -> Vertical a)) ((Construction Wye <:.:> (Bifurcation <:.> Bicursor)) := (:*:)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Morphable ('Rotate ('Down ('Right :: a -> Wye a)) :: Morph (Vertical (a -> Wye a))) ((Construction Wye <:.:> (Bifurcation <:.> Bicursor)) := (:*:)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Morphable ('Rotate ('Down ('Left :: a -> Wye a)) :: Morph (Vertical (a -> Wye a))) ((Construction Wye <:.:> (Bifurcation <:.> Bicursor)) := (:*:)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Covariant t => Hoistable (TU Covariant Covariant t :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
Morphable ('Pop :: a -> Morph a) List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Morphable ('Push :: a -> Morph a) List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
(forall a1. Chain a1) => Morphable ('Insert :: a -> Morph a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Substructure ('Tail :: a -> Segment a) List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
Substructure ('Just :: a -> Maybe a) Rose Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
Substructure ('Right :: a -> Wye a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Substructure ('Left :: a -> Wye a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Substructure ('Just :: a -> Maybe a) (Construction List) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
(Covariant t, Covariant u) => Covariant (t <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
(Bindable t, Distributive t, Bindable u) => Bindable (t <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
(Applicative t, Applicative u) => Applicative (t <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
(Covariant u, Alternative t) => Alternative (t <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
(Covariant u, Avoidable t) => Avoidable (t <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
Extendable u => Extendable ((:*:) e <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Inventory.Equipment |
(Extractable t, Extractable u) => Extractable (t <:.> u) Source # | |
|
(Pointable t, Pointable u) => Pointable (t <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
(Traversable t, Traversable u) => Traversable (t <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU Methods (->>) :: (Pointable u0, Applicative u0) => (t <:.> u) a -> (a -> u0 b) -> (u0 :. (t <:.> u)) := b Source # traverse :: (Pointable u0, Applicative u0) => (a -> u0 b) -> (t <:.> u) a -> (u0 :. (t <:.> u)) := b Source # sequence :: (Pointable u0, Applicative u0) => (((t <:.> u) :. u0) := a) -> (u0 :. (t <:.> u)) := a Source # (->>>) :: (Pointable u0, Applicative u0, Traversable v) => ((v :. (t <:.> u)) := a) -> (a -> u0 b) -> (u0 :. (v :. (t <:.> u))) := b Source # (->>>>) :: (Pointable u0, Applicative u0, Traversable v, Traversable w) => ((w :. (v :. (t <:.> u))) := a) -> (a -> u0 b) -> (u0 :. (w :. (v :. (t <:.> u)))) := b Source # (->>>>>) :: (Pointable u0, Applicative u0, Traversable v, Traversable w, Traversable j) => ((j :. (w :. (v :. (t <:.> u)))) := a) -> (a -> u0 b) -> (u0 :. (j :. (w :. (v :. (t <:.> u))))) := b Source # |
(Covariant (t <.:> v), Covariant (w <:.> u), Adjoint v u, Adjoint t w) => Adjoint (t <.:> v) (w <:.> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes |
(Covariant (v <:.> t), Covariant (w <.:> u), Adjoint t u, Adjoint v w) => Adjoint (v <:.> t) (w <.:> u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes |
(Covariant (v <:.> t), Covariant (u <:.> w), Adjoint t u, Adjoint v w) => Adjoint (v <:.> t) (u <:.> w) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes |
Pointable t => Liftable (TU Covariant Covariant t :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
Extractable t => Lowerable (TU Covariant Covariant t :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
Interpreted (TU ct cu t u) Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |
type Nonempty List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Nonempty Rose Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
type Nonempty Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Zipper List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Measural 'Length List a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Measural 'Heighth Binary a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Focusing ('Root :: Type -> Location Type) Rose a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
type Focusing ('Root :: Type -> Location Type) Binary a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Focusing ('Head :: Type -> Location Type) List a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Focusing ('Root :: Type -> Location Type) (Construction List) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
type Morphing ('Into (o ds) :: Morph a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
type Morphing ('Into List) (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Morphing ('Into Binary) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Morphing ('Rotate ('Right :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((List <:.:> List) := (:*:))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Morphing ('Rotate ('Left :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((List <:.:> List) := (:*:))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Morphing ('Rotate ('Up :: a -> Vertical a) :: Morph (a -> Vertical a)) ((Construction Wye <:.:> (Bifurcation <:.> Bicursor)) := (:*:)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Morphing ('Rotate ('Down ('Right :: a -> Wye a)) :: Morph (Vertical (a -> Wye a))) ((Construction Wye <:.:> (Bifurcation <:.> Bicursor)) := (:*:)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Morphing ('Rotate ('Down ('Left :: a -> Wye a)) :: Morph (Vertical (a -> Wye a))) ((Construction Wye <:.:> (Bifurcation <:.> Bicursor)) := (:*:)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Morphing ('Pop :: a -> Morph a) List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Morphing ('Push :: a -> Morph a) List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Morphing ('Insert :: a -> Morph a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Substructural ('Tail :: a -> Segment a) List Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.List |
type Substructural ('Just :: a -> Maybe a) Rose Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
type Substructural ('Right :: a -> Wye a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Substructural ('Left :: a -> Wye a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Substructural ('Just :: a -> Maybe a) (Construction List) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
type Primary (TU ct cu t u) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Schemes.TU |