{-# OPTIONS_GHC -Wno-deprecations #-}
module Data.Barbie
{-# DEPRECATED "Use Data.Functor.Barbie or Barbies instead" #-}
(
FunctorB(bmap)
, TraversableB(btraverse)
, btraverse_
, bfoldMap
, bsequence, bsequence'
, ProductB(buniq, bprod)
, CanDeriveProductB
, App.bzip
, App.bunzip
, App.bzipWith
, App.bzipWith3
, App.bzipWith4
, ConstraintsB(AllB, baddDicts)
, AllBF
, bmapC
, btraverseC
, ProductBC(bdicts)
, CanDeriveProductBC
, buniqC
, bmempty
, Barbie(..)
, Trivial.Void
, Trivial.Unit (..)
, Rec(..)
, GProductB(..)
, GProductBC(..)
, (/*/), (/*)
)
where
import Barbies.Internal.ConstraintsB (AllBF, ConstraintsB (..), bmapC, btraverseC, bmempty)
import Barbies.Internal.FunctorB(FunctorB(..))
import Barbies.Internal.Wrappers(Barbie(..))
import qualified Barbies.Internal.ApplicativeB as App
import Data.Barbie.Internal.Product(ProductB(..), CanDeriveProductB, GProductB(..))
import Data.Barbie.Internal.ProductC(ProductBC(..), CanDeriveProductBC, GProductBC(..), buniqC)
import Barbies.Internal.TraversableB
( TraversableB(..)
, bsequence, bsequence'
, bfoldMap, btraverse_
)
import qualified Barbies.Internal.Trivial as Trivial
import Data.Functor.Product (Product(Pair))
import Data.Functor.Prod (Prod(..), oneTuple, prod)
import Data.Generics.GenericN (Rec(..))
{-# DEPRECATED (/*/), (/*) "Use bzipWith2, bzipWith3, etc" #-}
(/*/)
:: ProductB b => b f -> b g -> b (Prod '[f, g])
l /*/ r
= bmap (\(Pair f g) -> Cons f (Cons g Unit)) (l `bprod` r)
infixr 4 /*/
(/*) :: ProductB b => b f -> b (Prod fs) -> b (Prod (f ': fs))
l /* r =
bmap (\(Pair f fs) -> oneTuple f `prod` fs) (l `bprod` r)
infixr 4 /*