| Copyright | (c) Galois Inc 2017-2019 | 
|---|---|
| Safe Haskell | Safe | 
| Language | Haskell98 | 
Data.Parameterized.Pair
Description
This module defines a 2-tuple where both elements are parameterized over the same existentially quantified parameter.
Documentation
data Pair (a :: k -> *) (b :: k -> *) where Source #
Like a 2-tuple, but with an existentially quantified parameter that both of the elements share.
Instances
| FoldableF (Pair a :: (k -> Type) -> Type) Source # | |
| Defined in Data.Parameterized.Pair Methods foldMapF :: Monoid m => (forall (s :: k0). e s -> m) -> Pair a e -> m Source # foldrF :: (forall (s :: k0). e s -> b -> b) -> b -> Pair a e -> b Source # foldlF :: (forall (s :: k0). b -> e s -> b) -> b -> Pair a e -> b Source # foldrF' :: (forall (s :: k0). e s -> b -> b) -> b -> Pair a e -> b Source # foldlF' :: (forall (s :: k0). b -> e s -> b) -> b -> Pair a e -> b Source # toListF :: (forall (tp :: k0). f tp -> a0) -> Pair a f -> [a0] Source # | |
| FunctorF (Pair a :: (k -> Type) -> Type) Source # | |
| (TestEquality a, EqF b) => Eq (Pair a b) Source # | |
| IsBinTree (MapF k2 a) (Pair k2 a) Source # | |