Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Data.Reader.Reader2
Documentation
newtype Reader2T (f :: Type -> Type) a b Source #
Constructors
Reader2T (a -> f b) |
Instances
reader2 :: forall a b a' b' p f. (Profunctor p, Functor f) => p (a -> b) (f (a' -> b')) -> p (Reader2 a b) (f (Reader2 a' b')) Source #
reader2Lens :: forall f1 s t a b f' s' t' a' b' p f2. (Profunctor p, Functor f2) => p (Reader2Lens f1 s t a b) (f2 (Reader2Lens f' s' t' a' b')) -> p (LensLike f1 s t a b) (f2 (LensLike f' s' t' a' b')) Source #
reader2' :: forall a (f1 :: Type -> Type) b a' (f' :: Type -> Type) b' p f2. (Profunctor p, Functor f2) => p (Reader2T f1 a b) (f2 (Reader2T f' a' b')) -> p (ReaderT a f1 b) (f2 (ReaderT a' f' b')) Source #
star2 :: forall (f1 :: Type -> Type) a b (f' :: Type -> Type) a' b' p f2. (Profunctor p, Functor f2) => p (Reader2T f1 a b) (f2 (Reader2T f' a' b')) -> p (Star f1 a b) (f2 (Star f' a' b')) Source #
kleisli2 :: forall (f1 :: Type -> Type) a b (f' :: Type -> Type) a' b' p f2. (Profunctor p, Functor f2) => p (Reader2T f1 a b) (f2 (Reader2T f' a' b')) -> p (Kleisli f1 a b) (f2 (Kleisli f' a' b')) Source #
liftReader2 :: forall f1 a b f' a' b' p f2. (Profunctor p, Functor f2) => p (Reader2 a (f1 b)) (f2 (Reader2 a' (f' b'))) -> p (Reader2T f1 a b) (f2 (Reader2T f' a' b')) Source #
pureReader2 :: forall (f :: Type -> Type) a b. Applicative f => Reader2 a b -> Reader2T f a b Source #
homReader2 :: (forall x. f x -> g x) -> Reader2T f a b -> Reader2T g a b Source #