Insertable Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
(forall a. Chain a) => Insertable Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Deletable Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Lowerable Construction Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Measurable 'Length Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Measurable 'Heighth Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Measurable 'Length (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Measurable 'Heighth (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Monotonic a (Construction Maybe a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Monotonic a ((Maybe <:.> Construction Maybe) := a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
(forall a. Chain a) => Insertable (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Insertable (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Covariant t => Covariant (Construction t) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Alternative t => Bindable (Construction t) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Applicative t => Applicative (Construction t) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Extendable (Tap ((:*:) <:.:> Stream)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stream |
Extendable (Tap ((:*:) <:.:> Stack)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Covariant t => Extendable (Construction t) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Covariant t => Extractable (Construction t) Source # | |
|
Covariant t => Comonad (Construction t) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Avoidable t => Pointable (Construction t) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
(Avoidable t, Alternative t) => Monad (Construction t) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Traversable t => Traversable (Construction t) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction Methods (->>) :: (Pointable u, Applicative u) => Construction t a -> (a -> u b) -> (u :. Construction t) := b Source # traverse :: (Pointable u, Applicative u) => (a -> u b) -> Construction t a -> (u :. Construction t) := b Source # sequence :: (Pointable u, Applicative u) => ((Construction t :. u) := a) -> (u :. Construction t) := a Source # (->>>) :: (Pointable u, Applicative u, Traversable v) => ((v :. Construction t) := a) -> (a -> u b) -> (u :. (v :. Construction t)) := b Source # (->>>>) :: (Pointable u, Applicative u, Traversable v, Traversable w) => ((w :. (v :. Construction t)) := a) -> (a -> u b) -> (u :. (w :. (v :. Construction t))) := b Source # (->>>>>) :: (Pointable u, Applicative u, Traversable v, Traversable w, Traversable j) => ((j :. (w :. (v :. Construction t))) := a) -> (a -> u b) -> (u :. (j :. (w :. (v :. Construction t)))) := b Source # |
Semigroup (Stack a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Monoid (Stack a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Setoid a => Setoid (Stack a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Nullable Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Nullable Rose Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
Nullable Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Hoistable Construction Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
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) Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Focusable ('Root :: Type -> Location Type) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Focusable ('Root :: Type -> Location Type) (Construction Stack) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
Focusable ('Head :: Type -> Location Type) (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Morphable ('Into (o ds)) (Construction Wye) => Morphable ('Into (o ds) :: Morph a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
Morphable ('Into Stack) (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
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 ((:*:) <:.:> Stream)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stream |
Morphable ('Rotate ('Left :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Stream)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stream |
Morphable ('Rotate ('Right :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Construction Maybe)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Morphable ('Rotate ('Left :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Construction Maybe)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Morphable ('Rotate ('Right :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Stack)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Morphable ('Rotate ('Left :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Stack)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Morphable ('Rotate ('Right ('Zig :: a -> Splay a)) :: Morph (Wye (a -> Splay a))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
Morphable ('Rotate ('Left ('Zig :: a -> Splay a)) :: Morph (Wye (a -> Splay a))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
Morphable ('Rotate ('Right ('Zig ('Zag :: a -> Splay a))) :: Morph (Wye (Splay (a -> Splay a)))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
Morphable ('Rotate ('Left ('Zig ('Zag :: a -> Splay a))) :: Morph (Wye (Splay (a -> Splay a)))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
Morphable ('Rotate ('Right ('Zig ('Zig :: a -> Splay a))) :: Morph (Wye (Splay (a -> Splay a)))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
Morphable ('Rotate ('Left ('Zig ('Zig :: a -> Splay a))) :: Morph (Wye (Splay (a -> Splay a)))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
Morphable ('Into ('Preorder (Construction Maybe))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
Morphable ('Into ('Inorder (Construction Maybe))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
Morphable ('Into ('Postorder (Construction Maybe))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
Morphable ('Rotate ('Up :: a -> Vertical a) :: Morph (a -> Vertical a)) (T_U Covariant Covariant (Construction Wye) (:*:) ((Biforked <:.> Construction Biforked) <:.> T_U Covariant Covariant Identity (:*:) (Maybe <:.> Construction Wye))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Morphable ('Rotate ('Down ('Right :: a -> Wye a)) :: Morph (Vertical (a -> Wye a))) (T_U Covariant Covariant (Construction Wye) (:*:) ((Biforked <:.> Construction Biforked) <:.> T_U Covariant Covariant Identity (:*:) (Maybe <:.> Construction Wye))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Morphable ('Rotate ('Down ('Left :: a -> Wye a)) :: Morph (Vertical (a -> Wye a))) (T_U Covariant Covariant (Construction Wye) (:*:) ((Biforked <:.> Construction Biforked) <:.> T_U Covariant Covariant Identity (:*:) (Maybe <:.> Construction Wye))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
(Semigroup a, forall b. Semigroup b => Semigroup (t b), Covariant t) => Semigroup (Construction t a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Semigroup (Construction Maybe a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
(Monoid a, forall b. Semigroup b => Monoid (t b), Covariant t) => Monoid (Construction t a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
(Setoid a, forall b. Setoid b => Setoid (t b), Covariant t) => Setoid (Construction t a) Source # | |
Instance detailsDefined in Pandora.Paradigm.Primary.Transformer.Construction |
Substructure ('Tail :: a -> Segment a) Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
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 ('Tail :: a -> Segment a) (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
Substructure ('Just :: a -> Maybe a) (Construction Stack) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
Substructure ('Right :: a -> Wye a) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
Substructure ('Left :: a -> Wye a) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Nonempty Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
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 Stream Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stream |
type Zipper Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Measural 'Length Stack a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Measural 'Heighth Binary a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Measural 'Length (Construction Maybe) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Measural 'Heighth (Construction Wye) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Zipper (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Zipper (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
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) Stack a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Focusing ('Root :: Type -> Location Type) (Construction Wye) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Focusing ('Root :: Type -> Location Type) (Construction Stack) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
type Focusing ('Head :: Type -> Location Type) (Construction Maybe) a Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Morphing ('Into (o ds) :: Morph a) Binary Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
type Morphing ('Into Stack) (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
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 ((:*:) <:.:> Stream)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stream |
type Morphing ('Rotate ('Left :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Stream)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stream |
type Morphing ('Rotate ('Right :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Construction Maybe)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Morphing ('Rotate ('Left :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Construction Maybe)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Morphing ('Rotate ('Right :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Stack)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Morphing ('Rotate ('Left :: a -> Wye a) :: Morph (a -> Wye a)) (Tap ((:*:) <:.:> Stack)) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Morphing ('Rotate ('Right ('Zig :: a -> Splay a)) :: Morph (Wye (a -> Splay a))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
type Morphing ('Rotate ('Left ('Zig :: a -> Splay a)) :: Morph (Wye (a -> Splay a))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
type Morphing ('Rotate ('Right ('Zig ('Zag :: a -> Splay a))) :: Morph (Wye (Splay (a -> Splay a)))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
type Morphing ('Rotate ('Left ('Zig ('Zag :: a -> Splay a))) :: Morph (Wye (Splay (a -> Splay a)))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
type Morphing ('Rotate ('Right ('Zig ('Zig :: a -> Splay a))) :: Morph (Wye (Splay (a -> Splay a)))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
type Morphing ('Rotate ('Left ('Zig ('Zig :: a -> Splay a))) :: Morph (Wye (Splay (a -> Splay a)))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Splay |
type Morphing ('Into ('Preorder (Construction Maybe))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
type Morphing ('Into ('Inorder (Construction Maybe))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
type Morphing ('Into ('Postorder (Construction Maybe))) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure |
type Morphing ('Rotate ('Up :: a -> Vertical a) :: Morph (a -> Vertical a)) (T_U Covariant Covariant (Construction Wye) (:*:) ((Biforked <:.> Construction Biforked) <:.> T_U Covariant Covariant Identity (:*:) (Maybe <:.> Construction Wye))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Morphing ('Rotate ('Down ('Right :: a -> Wye a)) :: Morph (Vertical (a -> Wye a))) (T_U Covariant Covariant (Construction Wye) (:*:) ((Biforked <:.> Construction Biforked) <:.> T_U Covariant Covariant Identity (:*:) (Maybe <:.> Construction Wye))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Morphing ('Rotate ('Down ('Left :: a -> Wye a)) :: Morph (Vertical (a -> Wye a))) (T_U Covariant Covariant (Construction Wye) (:*:) ((Biforked <:.> Construction Biforked) <:.> T_U Covariant Covariant Identity (:*:) (Maybe <:.> Construction Wye))) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Substructural ('Tail :: a -> Segment a) Stack Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
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 ('Tail :: a -> Segment a) (Construction Maybe) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Stack |
type Substructural ('Just :: a -> Maybe a) (Construction Stack) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Rose |
type Substructural ('Right :: a -> Wye a) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |
type Substructural ('Left :: a -> Wye a) (Construction Wye) Source # | |
Instance detailsDefined in Pandora.Paradigm.Structure.Some.Binary |