{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE TypeFamilies #-}
{-# OPTIONS_GHC -Wno-orphans #-}
module Barbies.Internal.ApplicativeB
( ApplicativeB(bpure, bprod)
, bzip, bunzip, bzipWith, bzipWith3, bzipWith4
, CanDeriveApplicativeB
, gbprodDefault, gbpureDefault
)
where
import Barbies.Generics.Applicative(GApplicative(..))
import Barbies.Internal.FunctorB (FunctorB (..))
import Data.Functor.Const (Const (..))
import Data.Functor.Constant(Constant (..))
import Data.Functor.Product (Product (..))
import Data.Kind (Type)
import Data.Proxy (Proxy (..))
import Data.Generics.GenericN
class FunctorB b => ApplicativeB (b :: (k -> Type) -> Type) where
bpure
:: (forall a . f a)
-> b f
bprod
:: b f
-> b g
-> b (f `Product` g)
default bpure
:: CanDeriveApplicativeB b f f
=> (forall a . f a)
-> b f
bpure = (forall (a :: k). f a) -> b f
forall k (b :: (k -> *) -> *) (f :: k -> *).
CanDeriveApplicativeB b f f =>
(forall (a :: k). f a) -> b f
gbpureDefault
default bprod
:: CanDeriveApplicativeB b f g
=> b f
-> b
g -> b (f `Product` g)
bprod = b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
CanDeriveApplicativeB b f g =>
b f -> b g -> b (Product f g)
gbprodDefault
bzip
:: ApplicativeB b
=> b f
-> b g
-> b (f `Product` g)
bzip :: b f -> b g -> b (Product f g)
bzip = b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
bprod
bunzip
:: ApplicativeB b
=> b (f `Product` g)
-> (b f, b g)
bunzip :: b (Product f g) -> (b f, b g)
bunzip b (Product f g)
bfg
= ((forall (a :: k). Product f g a -> f a) -> b (Product f g) -> b f
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
FunctorB b =>
(forall (a :: k). f a -> g a) -> b f -> b g
bmap (\(Pair a _) -> f a
a) b (Product f g)
bfg, (forall (a :: k). Product f g a -> g a) -> b (Product f g) -> b g
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
FunctorB b =>
(forall (a :: k). f a -> g a) -> b f -> b g
bmap (\(Pair _ b) -> g a
b) b (Product f g)
bfg)
bzipWith
:: ApplicativeB b
=> (forall a. f a -> g a -> h a)
-> b f
-> b g
-> b h
bzipWith :: (forall (a :: k). f a -> g a -> h a) -> b f -> b g -> b h
bzipWith forall (a :: k). f a -> g a -> h a
f b f
bf b g
bg
= (forall (a :: k). Product f g a -> h a) -> b (Product f g) -> b h
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
FunctorB b =>
(forall (a :: k). f a -> g a) -> b f -> b g
bmap (\(Pair fa ga) -> f a -> g a -> h a
forall (a :: k). f a -> g a -> h a
f f a
fa g a
ga) (b f
bf b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
`bprod` b g
bg)
bzipWith3
:: ApplicativeB b
=> (forall a. f a -> g a -> h a -> i a)
-> b f
-> b g
-> b h
-> b i
bzipWith3 :: (forall (a :: k). f a -> g a -> h a -> i a)
-> b f -> b g -> b h -> b i
bzipWith3 forall (a :: k). f a -> g a -> h a -> i a
f b f
bf b g
bg b h
bh
= (forall (a :: k). Product (Product f g) h a -> i a)
-> b (Product (Product f g) h) -> b i
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
FunctorB b =>
(forall (a :: k). f a -> g a) -> b f -> b g
bmap (\(Pair (Pair fa ga) ha) -> f a -> g a -> h a -> i a
forall (a :: k). f a -> g a -> h a -> i a
f f a
fa g a
ga h a
ha)
(b f
bf b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
`bprod` b g
bg b (Product f g) -> b h -> b (Product (Product f g) h)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
`bprod` b h
bh)
bzipWith4
:: ApplicativeB b
=> (forall a. f a -> g a -> h a -> i a -> j a)
-> b f
-> b g
-> b h
-> b
i -> b j
bzipWith4 :: (forall (a :: k). f a -> g a -> h a -> i a -> j a)
-> b f -> b g -> b h -> b i -> b j
bzipWith4 forall (a :: k). f a -> g a -> h a -> i a -> j a
f b f
bf b g
bg b h
bh b i
bi
= (forall (a :: k). Product (Product (Product f g) h) i a -> j a)
-> b (Product (Product (Product f g) h) i) -> b j
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
FunctorB b =>
(forall (a :: k). f a -> g a) -> b f -> b g
bmap (\(Pair (Pair (Pair fa ga) ha) ia) -> f a -> g a -> h a -> i a -> j a
forall (a :: k). f a -> g a -> h a -> i a -> j a
f f a
fa g a
ga h a
ha i a
ia)
(b f
bf b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
`bprod` b g
bg b (Product f g) -> b h -> b (Product (Product f g) h)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
`bprod` b h
bh b (Product (Product f g) h)
-> b i -> b (Product (Product (Product f g) h) i)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
`bprod` b i
bi)
type CanDeriveApplicativeB b f g
= ( GenericP 0 (b f)
, GenericP 0 (b g)
, GenericP 0 (b (f `Product` g))
, GApplicative 0 f g (RepP 0 (b f)) (RepP 0 (b g)) (RepP 0 (b (f `Product` g)))
)
gbprodDefault
:: forall b f g
. CanDeriveApplicativeB b f g
=> b f
-> b g
-> b (f `Product` g)
gbprodDefault :: b f -> b g -> b (Product f g)
gbprodDefault b f
l b g
r
= Proxy 0 -> RepP 0 (b (Product f g)) Any -> b (Product f g)
forall (n :: Nat) a x. GenericP n a => Proxy n -> RepP n a x -> a
toP Proxy 0
p0 (RepP 0 (b (Product f g)) Any -> b (Product f g))
-> RepP 0 (b (Product f g)) Any -> b (Product f g)
forall a b. (a -> b) -> a -> b
$ Proxy 0
-> Proxy f
-> Proxy g
-> Zip
(Rep (FilterIndex 0 (Indexed b 1) (Param 0 f))) (Rep (b f)) Any
-> Zip
(Rep (FilterIndex 0 (Indexed b 1) (Param 0 g))) (Rep (b g)) Any
-> Zip
(Rep (FilterIndex 0 (Indexed b 1) (Param 0 (Product f g))))
(Rep (b (Product f g)))
Any
forall k k k (n :: k) (f :: k -> *) (g :: k -> *) (repbf :: k -> *)
(repbg :: k -> *) (repbfg :: k -> *) (x :: k).
GApplicative n f g repbf repbg repbfg =>
Proxy n -> Proxy f -> Proxy g -> repbf x -> repbg x -> repbfg x
gprod Proxy 0
p0 (Proxy f
forall k (t :: k). Proxy t
Proxy @f) (Proxy g
forall k (t :: k). Proxy t
Proxy @g) (Proxy 0 -> b f -> RepP 0 (b f) Any
forall (n :: Nat) a x. GenericP n a => Proxy n -> a -> RepP n a x
fromP Proxy 0
p0 b f
l) (Proxy 0 -> b g -> RepP 0 (b g) Any
forall (n :: Nat) a x. GenericP n a => Proxy n -> a -> RepP n a x
fromP Proxy 0
p0 b g
r)
where
p0 :: Proxy 0
p0 = Proxy 0
forall k (t :: k). Proxy t
Proxy @0
{-# INLINE gbprodDefault #-}
gbpureDefault
:: forall b f
. CanDeriveApplicativeB b f f
=> (forall a . f a)
-> b f
gbpureDefault :: (forall (a :: k). f a) -> b f
gbpureDefault forall (a :: k). f a
fa
= Proxy 0 -> RepP 0 (b f) Any -> b f
forall (n :: Nat) a x. GenericP n a => Proxy n -> RepP n a x -> a
toP (Proxy 0
forall k (t :: k). Proxy t
Proxy @0) (RepP 0 (b f) Any -> b f) -> RepP 0 (b f) Any -> b f
forall a b. (a -> b) -> a -> b
$ Proxy 0
-> Proxy f
-> Proxy
(Zip (Rep (FilterIndex 0 (Indexed b 1) (Param 0 f))) (Rep (b f)))
-> Proxy
(Zip
(Rep (FilterIndex 0 (Indexed b 1) (Param 0 (Product f f))))
(Rep (b (Product f f))))
-> (forall (a :: k). f a)
-> Zip
(Rep (FilterIndex 0 (Indexed b 1) (Param 0 f))) (Rep (b f)) Any
forall k k k (n :: k) (f :: k -> *) (g :: k -> *) (repbf :: k -> *)
(repbg :: k -> *) (repbfg :: k -> *) (x :: k).
(GApplicative n f g repbf repbg repbfg, f ~ g, repbf ~ repbg) =>
Proxy n
-> Proxy f
-> Proxy repbf
-> Proxy repbfg
-> (forall (a :: k). f a)
-> repbf x
gpure
(Proxy 0
forall k (t :: k). Proxy t
Proxy @0)
(Proxy f
forall k (t :: k). Proxy t
Proxy @f)
(Proxy (RepP 0 (b f))
forall k (t :: k). Proxy t
Proxy @(RepP 0 (b f)))
(Proxy (RepP 0 (b (Product f f)))
forall k (t :: k). Proxy t
Proxy @(RepP 0 (b (f `Product` f))))
forall (a :: k). f a
fa
{-# INLINE gbpureDefault #-}
type P = Param
instance
( ApplicativeB b
) => GApplicative 0 f g (Rec (b (P 0 f)) (b f))
(Rec (b (P 0 g)) (b g))
(Rec (b (P 0 (f `Product` g))) (b (f `Product` g)))
where
gpure :: Proxy 0
-> Proxy f
-> Proxy (Rec (b (P 0 f)) (b f))
-> Proxy (Rec (b (P 0 (Product f g))) (b (Product f g)))
-> (forall (a :: k). f a)
-> Rec (b (P 0 f)) (b f) x
gpure Proxy 0
_ Proxy f
_ Proxy (Rec (b (P 0 f)) (b f))
_ Proxy (Rec (b (P 0 (Product f g))) (b (Product f g)))
_ forall (a :: k). f a
fa
= K1 R (b f) x -> Rec (b (P 0 f)) (b f) x
forall k p a (x :: k). K1 R a x -> Rec p a x
Rec (b f -> K1 R (b f) x
forall k i c (p :: k). c -> K1 i c p
K1 ((forall (a :: k). f a) -> b f
forall k (b :: (k -> *) -> *) (f :: k -> *).
ApplicativeB b =>
(forall (a :: k). f a) -> b f
bpure forall (a :: k). f a
fa))
{-# INLINE gpure #-}
gprod :: Proxy 0
-> Proxy f
-> Proxy g
-> Rec (b (P 0 f)) (b f) x
-> Rec (b (P 0 g)) (b g) x
-> Rec (b (P 0 (Product f g))) (b (Product f g)) x
gprod Proxy 0
_ Proxy f
_ Proxy g
_ (Rec (K1 b f
bf)) (Rec (K1 b g
bg))
= K1 R (b (Product f g)) x
-> Rec (b (P 0 (Product f g))) (b (Product f g)) x
forall k p a (x :: k). K1 R a x -> Rec p a x
Rec (b (Product f g) -> K1 R (b (Product f g)) x
forall k i c (p :: k). c -> K1 i c p
K1 (b f
bf b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
`bprod` b g
bg))
{-# INLINE gprod #-}
instance
( Applicative h
, ApplicativeB b
) => GApplicative 0 f g (Rec (h (b (P 0 f))) (h (b f)))
(Rec (h (b (P 0 g))) (h (b g)))
(Rec (h (b (P 0 (f `Product` g)))) (h (b (f `Product` g))))
where
gpure :: Proxy 0
-> Proxy f
-> Proxy (Rec (h (b (P 0 f))) (h (b f)))
-> Proxy (Rec (h (b (P 0 (Product f g)))) (h (b (Product f g))))
-> (forall (a :: k). f a)
-> Rec (h (b (P 0 f))) (h (b f)) x
gpure Proxy 0
_ Proxy f
_ Proxy (Rec (h (b (P 0 f))) (h (b f)))
_ Proxy (Rec (h (b (P 0 (Product f g)))) (h (b (Product f g))))
_ forall (a :: k). f a
fa
= K1 R (h (b f)) x -> Rec (h (b (P 0 f))) (h (b f)) x
forall k p a (x :: k). K1 R a x -> Rec p a x
Rec (h (b f) -> K1 R (h (b f)) x
forall k i c (p :: k). c -> K1 i c p
K1 (b f -> h (b f)
forall (f :: * -> *) a. Applicative f => a -> f a
pure (b f -> h (b f)) -> b f -> h (b f)
forall a b. (a -> b) -> a -> b
$ (forall (a :: k). f a) -> b f
forall k (b :: (k -> *) -> *) (f :: k -> *).
ApplicativeB b =>
(forall (a :: k). f a) -> b f
bpure forall (a :: k). f a
fa))
{-# INLINE gpure #-}
gprod :: Proxy 0
-> Proxy f
-> Proxy g
-> Rec (h (b (P 0 f))) (h (b f)) x
-> Rec (h (b (P 0 g))) (h (b g)) x
-> Rec (h (b (P 0 (Product f g)))) (h (b (Product f g))) x
gprod Proxy 0
_ Proxy f
_ Proxy g
_ (Rec (K1 h (b f)
hbf)) (Rec (K1 h (b g)
hbg))
= K1 R (h (b (Product f g))) x
-> Rec (h (b (P 0 (Product f g)))) (h (b (Product f g))) x
forall k p a (x :: k). K1 R a x -> Rec p a x
Rec (h (b (Product f g)) -> K1 R (h (b (Product f g))) x
forall k i c (p :: k). c -> K1 i c p
K1 (b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
bprod (b f -> b g -> b (Product f g))
-> h (b f) -> h (b g -> b (Product f g))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> h (b f)
hbf h (b g -> b (Product f g)) -> h (b g) -> h (b (Product f g))
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> h (b g)
hbg))
{-# INLINE gprod #-}
instance
( Applicative h
, Applicative m
, ApplicativeB b
) => GApplicative 0 f g (Rec (m (h (b (P 0 f)))) (m (h (b f))))
(Rec (m (h (b (P 0 g)))) (m (h (b g))))
(Rec (m (h (b (P 0 (f `Product` g))))) (m (h (b (f `Product` g)))))
where
gpure :: Proxy 0
-> Proxy f
-> Proxy (Rec (m (h (b (P 0 f)))) (m (h (b f))))
-> Proxy
(Rec (m (h (b (P 0 (Product f g))))) (m (h (b (Product f g)))))
-> (forall (a :: k). f a)
-> Rec (m (h (b (P 0 f)))) (m (h (b f))) x
gpure Proxy 0
_ Proxy f
_ Proxy (Rec (m (h (b (P 0 f)))) (m (h (b f))))
_ Proxy
(Rec (m (h (b (P 0 (Product f g))))) (m (h (b (Product f g)))))
_ forall (a :: k). f a
x
= K1 R (m (h (b f))) x -> Rec (m (h (b (P 0 f)))) (m (h (b f))) x
forall k p a (x :: k). K1 R a x -> Rec p a x
Rec (m (h (b f)) -> K1 R (m (h (b f))) x
forall k i c (p :: k). c -> K1 i c p
K1 (h (b f) -> m (h (b f))
forall (f :: * -> *) a. Applicative f => a -> f a
pure (h (b f) -> m (h (b f))) -> (b f -> h (b f)) -> b f -> m (h (b f))
forall b c a. (b -> c) -> (a -> b) -> a -> c
. b f -> h (b f)
forall (f :: * -> *) a. Applicative f => a -> f a
pure (b f -> m (h (b f))) -> b f -> m (h (b f))
forall a b. (a -> b) -> a -> b
$ (forall (a :: k). f a) -> b f
forall k (b :: (k -> *) -> *) (f :: k -> *).
ApplicativeB b =>
(forall (a :: k). f a) -> b f
bpure forall (a :: k). f a
x))
{-# INLINE gpure #-}
gprod :: Proxy 0
-> Proxy f
-> Proxy g
-> Rec (m (h (b (P 0 f)))) (m (h (b f))) x
-> Rec (m (h (b (P 0 g)))) (m (h (b g))) x
-> Rec (m (h (b (P 0 (Product f g))))) (m (h (b (Product f g)))) x
gprod Proxy 0
_ Proxy f
_ Proxy g
_ (Rec (K1 m (h (b f))
hbf)) (Rec (K1 m (h (b g))
hbg))
= K1 R (m (h (b (Product f g)))) x
-> Rec (m (h (b (P 0 (Product f g))))) (m (h (b (Product f g)))) x
forall k p a (x :: k). K1 R a x -> Rec p a x
Rec (m (h (b (Product f g))) -> K1 R (m (h (b (Product f g)))) x
forall k i c (p :: k). c -> K1 i c p
K1 (h (b f) -> h (b g) -> h (b (Product f g))
forall k (f :: * -> *) (b :: (k -> *) -> *) (f :: k -> *)
(g :: k -> *).
(Applicative f, ApplicativeB b) =>
f (b f) -> f (b g) -> f (b (Product f g))
go (h (b f) -> h (b g) -> h (b (Product f g)))
-> m (h (b f)) -> m (h (b g) -> h (b (Product f g)))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> m (h (b f))
hbf m (h (b g) -> h (b (Product f g)))
-> m (h (b g)) -> m (h (b (Product f g)))
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> m (h (b g))
hbg))
where
go :: f (b f) -> f (b g) -> f (b (Product f g))
go f (b f)
a f (b g)
b = b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
bprod (b f -> b g -> b (Product f g))
-> f (b f) -> f (b g -> b (Product f g))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> f (b f)
a f (b g -> b (Product f g)) -> f (b g) -> f (b (Product f g))
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> f (b g)
b
{-# INLINE gprod #-}
instance ApplicativeB Proxy where
bpure :: (forall (a :: k). f a) -> Proxy f
bpure forall (a :: k). f a
_ = Proxy f
forall k (t :: k). Proxy t
Proxy
{-# INLINE bpure #-}
bprod :: Proxy f -> Proxy g -> Proxy (Product f g)
bprod Proxy f
_ Proxy g
_ = Proxy (Product f g)
forall k (t :: k). Proxy t
Proxy
{-# INLINE bprod #-}
instance Monoid a => ApplicativeB (Const a) where
bpure :: (forall (a :: k). f a) -> Const a f
bpure forall (a :: k). f a
_
= a -> Const a f
forall k a (b :: k). a -> Const a b
Const a
forall a. Monoid a => a
mempty
{-# INLINE bpure #-}
bprod :: Const a f -> Const a g -> Const a (Product f g)
bprod (Const a
l) (Const a
r)
= a -> Const a (Product f g)
forall k a (b :: k). a -> Const a b
Const (a
l a -> a -> a
forall a. Monoid a => a -> a -> a
`mappend` a
r)
{-# INLINE bprod #-}
instance (ApplicativeB a, ApplicativeB b) => ApplicativeB (Product a b) where
bpure :: (forall (a :: k). f a) -> Product a b f
bpure forall (a :: k). f a
x
= a f -> b f -> Product a b f
forall k (f :: k -> *) (g :: k -> *) (a :: k).
f a -> g a -> Product f g a
Pair ((forall (a :: k). f a) -> a f
forall k (b :: (k -> *) -> *) (f :: k -> *).
ApplicativeB b =>
(forall (a :: k). f a) -> b f
bpure forall (a :: k). f a
x) ((forall (a :: k). f a) -> b f
forall k (b :: (k -> *) -> *) (f :: k -> *).
ApplicativeB b =>
(forall (a :: k). f a) -> b f
bpure forall (a :: k). f a
x)
{-# INLINE bpure #-}
bprod :: Product a b f -> Product a b g -> Product a b (Product f g)
bprod (Pair a f
ll b f
lr) (Pair a g
rl b g
rr)
= a (Product f g) -> b (Product f g) -> Product a b (Product f g)
forall k (f :: k -> *) (g :: k -> *) (a :: k).
f a -> g a -> Product f g a
Pair (a f -> a g -> a (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
bprod a f
ll a g
rl) (b f -> b g -> b (Product f g)
forall k (b :: (k -> *) -> *) (f :: k -> *) (g :: k -> *).
ApplicativeB b =>
b f -> b g -> b (Product f g)
bprod b f
lr b g
rr)
{-# INLINE bprod #-}
instance Monoid a => ApplicativeB (Constant a) where
bpure :: (forall (a :: k). f a) -> Constant a f
bpure forall (a :: k). f a
_
= a -> Constant a f
forall k a (b :: k). a -> Constant a b
Constant a
forall a. Monoid a => a
mempty
{-# INLINE bpure #-}
bprod :: Constant a f -> Constant a g -> Constant a (Product f g)
bprod (Constant a
l) (Constant a
r)
= a -> Constant a (Product f g)
forall k a (b :: k). a -> Constant a b
Constant (a
l a -> a -> a
forall a. Monoid a => a -> a -> a
`mappend` a
r)
{-# INLINE bprod #-}