Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- type (:=) t a = t a
- type (:.) t u a = t (u a)
- type (.:) t u a = u (t a)
- type (:=>) a t = a -> t a
- type (:=:=>) a t = a -> t a -> t a
- type (<:=) a t = t a -> a
- type (~>) t u = forall a. t a -> u a
- type (~~>) t u = forall a b. t a b -> u a b
- type (::|:.) p a b = p (p a b) b
- type (::|.:) p a b = p a (p a b)
- type (::|::) p a b = p (p a b) (p a b)
- data t ::: u :: k -> k' -> *
Documentation
data t ::: u :: k -> k' -> * infixr 9 Source #
Instances
type Zipper List (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) Source # | |
type Zipper (Construction Identity) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) Source # | |
type Zipper (Comprehension Maybe) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) Source # | |
Defined in Pandora.Paradigm.Structure.Some.List | |
type Zipper (Construction Maybe) (('Left :: a1 -> Wye a1) ::: ('Right :: a2 -> Wye a2) :: k -> k' -> Type) Source # | |
Defined in Pandora.Paradigm.Structure.Some.List | |
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 # | |