| (forall a. Chain a) => Insertable Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| Covariant Wye Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Functor.Wye |
| Traversable Wye Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Functor.Wye Methods (->>) :: (Pointable u, Applicative u) => Wye a -> (a -> u b) -> (u :. Wye) := b Source # traverse :: (Pointable u, Applicative u) => (a -> u b) -> Wye a -> (u :. Wye) := b Source # sequence :: (Pointable u, Applicative u) => ((Wye :. u) := a) -> (u :. Wye) := a Source # (->>>) :: (Pointable u, Applicative u, Traversable v) => ((v :. Wye) := a) -> (a -> u b) -> (u :. (v :. Wye)) := b Source # (->>>>) :: (Pointable u, Applicative u, Traversable v, Traversable w) => ((w :. (v :. Wye)) := a) -> (a -> u b) -> (u :. (w :. (v :. Wye))) := b Source # (->>>>>) :: (Pointable u, Applicative u, Traversable v, Traversable w, Traversable j) => ((j :. (w :. (v :. Wye))) := a) -> (a -> u b) -> (u :. (j :. (w :. (v :. Wye)))) := b Source # |
| (forall a. Chain a) => Insertable (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| Substructure ('Left :: Type -> Wye Type) Delta Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| Substructure ('Left :: Type -> Wye Type) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| Substructure ('Right :: Type -> Wye Type) Delta Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| Substructure ('Right :: Type -> Wye Type) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| (forall a. Chain a) => Focusable ('Root :: Type -> Location Type) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| Substructure ('Left :: Type -> Wye Type) (Product s) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| Substructure ('Left :: Type -> Wye Type) t => Substructure ('Left :: Type -> Wye Type) (Tap (t <:.> u)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| Substructure ('Left :: Type -> Wye Type) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| Substructure ('Right :: Type -> Wye Type) (Product s) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| Substructure ('Right :: Type -> Wye Type) t => Substructure ('Right :: Type -> Wye Type) (Tap (t <:.> u)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| Substructure ('Right :: Type -> Wye Type) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| Focusable ('Root :: Type -> Location Type) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| Rotatable ('Right ('Zig :: a -> Splay a) :: Wye (a -> Splay a)) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| Rotatable ('Left ('Zig :: a -> Splay a) :: Wye (a -> Splay a)) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| Rotatable ('Right ('Zig ('Zag :: a -> Splay a)) :: Wye (Splay (a -> Splay a))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| Rotatable ('Left ('Zig ('Zag :: a -> Splay a)) :: Wye (Splay (a -> Splay a))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| Rotatable ('Right ('Zig ('Zig :: a -> Splay a)) :: Wye (Splay (a -> Splay a))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| Rotatable ('Left ('Zig ('Zig :: a -> Splay a)) :: Wye (Splay (a -> Splay a))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| Rotatable ('Right :: a -> Wye a) (Tap (Delta <:.> Stream)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Stream |
| Rotatable ('Left :: a -> Wye a) (Tap (Delta <:.> Stream)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Stream |
| Interpreted (Kan ('Left :: Type -> Wye Type) t u b) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Kan |
| Interpreted (Kan ('Right :: Type -> Wye Type) t u b) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Kan |
| Contravariant (Kan ('Left :: Type -> Wye Type) t u b) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Kan |
| Covariant (Kan ('Right :: Type -> Wye Type) t u b) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Kan |
| type Nonempty Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| data Kan ('Left :: Type -> Wye Type) t u b a Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Kan data Kan (' Left :: Type -> Wye Type) t u b a = Lan ((t b -> a) -> u b) |
| data Kan ('Right :: Type -> Wye Type) t u b a Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Kan data Kan (' Right :: Type -> Wye Type) t u b a = Ran ((a -> t b) -> u b) |
| type Substructural ('Left :: Type -> Wye Type) Delta a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| type Substructural ('Left :: Type -> Wye Type) Binary a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| type Substructural ('Right :: Type -> Wye Type) Delta a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| type Substructural ('Right :: Type -> Wye Type) Binary a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| type Focusing ('Root :: Type -> Location Type) Binary a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| type Substructural ('Left :: Type -> Wye Type) (Product s) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| type Substructural ('Left :: Type -> Wye Type) (Tap (t <:.> u)) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| type Substructural ('Left :: Type -> Wye Type) (Construction Wye) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| type Substructural ('Right :: Type -> Wye Type) (Product s) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| type Substructural ('Right :: Type -> Wye Type) (Tap (t <:.> u)) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
| type Substructural ('Right :: Type -> Wye Type) (Construction Wye) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| type Focusing ('Root :: Type -> Location Type) (Construction Wye) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Binary |
| type Rotational ('Right ('Zig :: a1 -> Splay a1) :: Wye (a1 -> Splay a1)) (Construction Wye) a2 Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| type Rotational ('Left ('Zig :: a1 -> Splay a1) :: Wye (a1 -> Splay a1)) (Construction Wye) a2 Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| type Rotational ('Right ('Zig ('Zag :: a1 -> Splay a1)) :: Wye (Splay (a1 -> Splay a1))) (Construction Wye) a2 Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| type Rotational ('Left ('Zig ('Zag :: a1 -> Splay a1)) :: Wye (Splay (a1 -> Splay a1))) (Construction Wye) a2 Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| type Rotational ('Right ('Zig ('Zig :: a1 -> Splay a1)) :: Wye (Splay (a1 -> Splay a1))) (Construction Wye) a2 Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| type Rotational ('Left ('Zig ('Zig :: a1 -> Splay a1)) :: Wye (Splay (a1 -> Splay a1))) (Construction Wye) a2 Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Splay |
| type Rotational ('Right :: a1 -> Wye a1) (Tap (Delta <:.> Stream)) a2 Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Stream |
| type Rotational ('Left :: a1 -> Wye a1) (Tap (Delta <:.> Stream)) a2 Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Stream |
| type Primary (Kan ('Left :: Type -> Wye Type) t u b) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Kan |
| type Primary (Kan ('Right :: Type -> Wye Type) t u b) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Kan |