module HLRDB.Primitives.Aggregate
(
T(..)
, type (⟿)
, type (~~>)
, type Query
, aggregatePair
, remember
, runT
, MSET
) where
import Data.Profunctor
import Data.Profunctor.Traversing
import Control.Lens hiding (Traversing)
import Data.ByteString
import HLRDB.Internal (MSET)
newtype T x y a b = T (Traversal a b x y) deriving (Functor)
instance Profunctor (T x y) where
dimap f g (T t) = T $ \m -> fmap g . t m . f
instance Traversing (T x y) where
traverse' (T t) = T (traverse . t)
instance Applicative (T x y a) where
pure x = T $ \_ _ -> pure x
(<*>) (T f) (T x) = T $ \g a -> f g a <*> x g a
{-# INLINE aggregatePair #-}
aggregatePair :: (Traversing p , Functor (p (a , a')) , Applicative (p (a , a'))) => p a b -> p a' b' -> p (a , a') (b , b')
aggregatePair x y =
(,) <$> lmap (view _1) x <*> lmap (view _2) y
remember :: T x y a b -> T x y a (a , b)
remember (T f) = T $ \x a -> (,) a <$> f x a
instance Strong (T x y) where
first' = firstTraversing
instance Choice (T x y) where
left' = leftTraversing
{-# INLINE runT #-}
runT :: Functor f => ([x] -> f [y]) -> T x y a b -> a -> f b
runT i (T t) = unsafePartsOf t i
type (⟿) a b = T ByteString (Maybe ByteString) a b
type (~~>) a b = T ByteString (Maybe ByteString) a b
type Query a b = a ⟿ b