module Generics.MultiRec.HFunctor where
import Control.Applicative (Applicative(..), (<$>), (<*>), WrappedMonad(..))
import Data.Traversable (Traversable(..))
import Generics.MultiRec.Base
class HFunctor phi f where
hmapA :: (Applicative a) =>
(forall ix. phi ix -> r ix -> a (r' ix)) ->
phi ix -> f r ix -> a (f r' ix)
instance El phi xi => HFunctor phi (I xi) where
hmapA f _ (I x) = I <$> f proof x
instance HFunctor phi (K x) where
hmapA _ _ (K x) = pure (K x)
instance HFunctor phi U where
hmapA _ _ U = pure U
instance (HFunctor phi f, HFunctor phi g) => HFunctor phi (f :+: g) where
hmapA f p (L x) = L <$> hmapA f p x
hmapA f p (R y) = R <$> hmapA f p y
instance (HFunctor phi f, HFunctor phi g) => HFunctor phi (f :*: g) where
hmapA f p (x :*: y) = (:*:) <$> hmapA f p x <*> hmapA f p y
instance HFunctor phi f => HFunctor phi (f :>: ix) where
hmapA f p (Tag x) = Tag <$> hmapA f p x
instance (Traversable f, HFunctor phi g) => HFunctor phi (f :.: g) where
hmapA f p (D x) = D <$> traverse (hmapA f p) x
instance (Constructor c, HFunctor phi f) => HFunctor phi (C c f) where
hmapA f p (C x) = C <$> hmapA f p x
hmap :: (HFunctor phi f) =>
(forall ix. phi ix -> r ix -> r' ix) ->
phi ix -> f r ix -> f r' ix
hmap f p x = unI0 (hmapA (\ ix x -> I0 (f ix x)) p x)
hmapM :: (HFunctor phi f, Monad m) =>
(forall ix. phi ix -> r ix -> m (r' ix)) ->
phi ix -> f r ix -> m (f r' ix)
hmapM f p x = unwrapMonad (hmapA (\ ix x -> WrapMonad (f ix x)) p x)