Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Transformation.Rank2
Description
Synopsis
- (<$>) :: Functor (Map p q) g => (forall a. p a -> q a) -> g p p -> g q q
- foldMap :: (Foldable (Fold p m) g, Monoid m) => (forall a. p a -> m) -> g p p -> m
- traverse :: Traversable (Traversal p q m) g => (forall a. p a -> m (q a)) -> g p p -> m (g q q)
- newtype Map (p :: Type -> Type) (q :: Type -> Type) = Map (forall x. p x -> q x)
- newtype Fold (p :: Type -> Type) m = Fold (forall x. p x -> m)
- newtype Traversal (p :: Type -> Type) (q :: Type -> Type) m = Traversal (forall x. p x -> m (q x))
Documentation
(<$>) :: Functor (Map p q) g => (forall a. p a -> q a) -> g p p -> g q q infixl 4 Source #
Transform (naturally) the containing functor of every node in the given tree.
foldMap :: (Foldable (Fold p m) g, Monoid m) => (forall a. p a -> m) -> g p p -> m Source #
Fold the containing functor of every node in the given tree.
traverse :: Traversable (Traversal p q m) g => (forall a. p a -> m (q a)) -> g p p -> m (g q q) Source #
Traverse the containing functors of all nodes in the given tree.
newtype Map (p :: Type -> Type) (q :: Type -> Type) Source #
Constructors
Map (forall x. p x -> q x) |
newtype Fold (p :: Type -> Type) m Source #
Constructors
Fold (forall x. p x -> m) |
newtype Traversal (p :: Type -> Type) (q :: Type -> Type) m Source #
Constructors
Traversal (forall x. p x -> m (q x)) |