Apply [] Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Maybe Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply IO Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Par1 Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Q Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Product Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Product (a -> b) -> Product a -> Product b Source # (.>) :: Product a -> Product b -> Product b Source # (<.) :: Product a -> Product b -> Product a Source # liftF2 :: (a -> b -> c) -> Product a -> Product b -> Product c Source # |
Apply Sum Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Identity Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Identity (a -> b) -> Identity a -> Identity b Source # (.>) :: Identity a -> Identity b -> Identity b Source # (<.) :: Identity a -> Identity b -> Identity a Source # liftF2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c Source # |
Apply NonEmpty Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b Source # (.>) :: NonEmpty a -> NonEmpty b -> NonEmpty b Source # (<.) :: NonEmpty a -> NonEmpty b -> NonEmpty a Source # liftF2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c Source # |
Apply Dual Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Seq Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Tree Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Down Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply ZipList Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: ZipList (a -> b) -> ZipList a -> ZipList b Source # (.>) :: ZipList a -> ZipList b -> ZipList b Source # (<.) :: ZipList a -> ZipList b -> ZipList a Source # liftF2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c Source # |
Apply First Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Last Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply First Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Last Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Max Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Min Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Option Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply Complex Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Complex (a -> b) -> Complex a -> Complex b Source # (.>) :: Complex a -> Complex b -> Complex b Source # (<.) :: Complex a -> Complex b -> Complex a Source # liftF2 :: (a -> b -> c) -> Complex a -> Complex b -> Complex c Source # |
Apply IntMap Source # | An IntMap is not Applicative , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply (Either a) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Either a (a0 -> b) -> Either a a0 -> Either a b Source # (.>) :: Either a a0 -> Either a b -> Either a b Source # (<.) :: Either a a0 -> Either a b -> Either a a0 Source # liftF2 :: (a0 -> b -> c) -> Either a a0 -> Either a b -> Either a c Source # |
Apply (V1 :: Type -> Type) Source # | A V1 is not Applicative , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply (U1 :: Type -> Type) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Semigroup m => Apply ((,) m) Source # | A '(,) m' is not Applicative unless its m is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: (m, a -> b) -> (m, a) -> (m, b) Source # (.>) :: (m, a) -> (m, b) -> (m, b) Source # (<.) :: (m, a) -> (m, b) -> (m, a) Source # liftF2 :: (a -> b -> c) -> (m, a) -> (m, b) -> (m, c) Source # |
Monad m => Apply (WrappedMonad m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b Source # (.>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b Source # (<.) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a Source # liftF2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c Source # |
Apply (Proxy :: Type -> Type) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply f => Apply (Lift f) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
(Functor m, Monad m) => Apply (MaybeT m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b Source # (.>) :: MaybeT m a -> MaybeT m b -> MaybeT m b Source # (<.) :: MaybeT m a -> MaybeT m b -> MaybeT m a Source # liftF2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c Source # |
Apply m => Apply (ListT m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: ListT m (a -> b) -> ListT m a -> ListT m b Source # (.>) :: ListT m a -> ListT m b -> ListT m b Source # (<.) :: ListT m a -> ListT m b -> ListT m a Source # liftF2 :: (a -> b -> c) -> ListT m a -> ListT m b -> ListT m c Source # |
Ord k => Apply (Map k) Source # | A 'Map k' is not Applicative , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class |
(Hashable k, Eq k) => Apply (HashMap k) Source # | A 'HashMap k' is not Applicative , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: HashMap k (a -> b) -> HashMap k a -> HashMap k b Source # (.>) :: HashMap k a -> HashMap k b -> HashMap k b Source # (<.) :: HashMap k a -> HashMap k b -> HashMap k a Source # liftF2 :: (a -> b -> c) -> HashMap k a -> HashMap k b -> HashMap k c Source # |
Apply f => Apply (MaybeApply f) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Applicative f => Apply (WrappedApplicative f) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply f => Apply (Rec1 f) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply w => Apply (IdentityT w) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: IdentityT w (a -> b) -> IdentityT w a -> IdentityT w b Source # (.>) :: IdentityT w a -> IdentityT w b -> IdentityT w b Source # (<.) :: IdentityT w a -> IdentityT w b -> IdentityT w a Source # liftF2 :: (a -> b -> c) -> IdentityT w a -> IdentityT w b -> IdentityT w c Source # |
Semigroup m => Apply (Const m :: Type -> Type) Source # | A 'Const m' is not Applicative unless its m is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Const m (a -> b) -> Const m a -> Const m b Source # (.>) :: Const m a -> Const m b -> Const m b Source # (<.) :: Const m a -> Const m b -> Const m a Source # liftF2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c Source # |
(Semigroup e, Apply w) => Apply (EnvT e w) Source # | An 'EnvT e w' is not Applicative unless its e is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: EnvT e w (a -> b) -> EnvT e w a -> EnvT e w b Source # (.>) :: EnvT e w a -> EnvT e w b -> EnvT e w b Source # (<.) :: EnvT e w a -> EnvT e w b -> EnvT e w a Source # liftF2 :: (a -> b -> c) -> EnvT e w a -> EnvT e w b -> EnvT e w c Source # |
(Apply w, Semigroup s) => Apply (StoreT s w) Source # | A 'StoreT s w' is not Applicative unless its s is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: StoreT s w (a -> b) -> StoreT s w a -> StoreT s w b Source # (.>) :: StoreT s w a -> StoreT s w b -> StoreT s w b Source # (<.) :: StoreT s w a -> StoreT s w b -> StoreT s w a Source # liftF2 :: (a -> b -> c) -> StoreT s w a -> StoreT s w b -> StoreT s w c Source # |
Apply w => Apply (TracedT m w) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: TracedT m w (a -> b) -> TracedT m w a -> TracedT m w b Source # (.>) :: TracedT m w a -> TracedT m w b -> TracedT m w b Source # (<.) :: TracedT m w a -> TracedT m w b -> TracedT m w a Source # liftF2 :: (a -> b -> c) -> TracedT m w a -> TracedT m w b -> TracedT m w c Source # |
Apply (Tagged a) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Tagged a (a0 -> b) -> Tagged a a0 -> Tagged a b Source # (.>) :: Tagged a a0 -> Tagged a b -> Tagged a b Source # (<.) :: Tagged a a0 -> Tagged a b -> Tagged a a0 Source # liftF2 :: (a0 -> b -> c) -> Tagged a a0 -> Tagged a b -> Tagged a c Source # |
Arrow a => Apply (WrappedArrow a b) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 Source # (.>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 Source # (<.) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 Source # liftF2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c Source # |
Apply f => Apply (Alt f) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply f => Apply (Backwards f) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Backwards f (a -> b) -> Backwards f a -> Backwards f b Source # (.>) :: Backwards f a -> Backwards f b -> Backwards f b Source # (<.) :: Backwards f a -> Backwards f b -> Backwards f a Source # liftF2 :: (a -> b -> c) -> Backwards f a -> Backwards f b -> Backwards f c Source # |
Semigroup f => Apply (Constant f :: Type -> Type) Source # | A 'Constant f' is not Applicative unless its f is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Constant f (a -> b) -> Constant f a -> Constant f b Source # (.>) :: Constant f a -> Constant f b -> Constant f b Source # (<.) :: Constant f a -> Constant f b -> Constant f a Source # liftF2 :: (a -> b -> c) -> Constant f a -> Constant f b -> Constant f c Source # |
(Functor m, Monad m) => Apply (ErrorT e m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: ErrorT e m (a -> b) -> ErrorT e m a -> ErrorT e m b Source # (.>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b Source # (<.) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m a Source # liftF2 :: (a -> b -> c) -> ErrorT e m a -> ErrorT e m b -> ErrorT e m c Source # |
(Functor m, Monad m) => Apply (ExceptT e m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: ExceptT e m (a -> b) -> ExceptT e m a -> ExceptT e m b Source # (.>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b Source # (<.) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m a Source # liftF2 :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c Source # |
Apply m => Apply (ReaderT e m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: ReaderT e m (a -> b) -> ReaderT e m a -> ReaderT e m b Source # (.>) :: ReaderT e m a -> ReaderT e m b -> ReaderT e m b Source # (<.) :: ReaderT e m a -> ReaderT e m b -> ReaderT e m a Source # liftF2 :: (a -> b -> c) -> ReaderT e m a -> ReaderT e m b -> ReaderT e m c Source # |
Bind m => Apply (StateT s m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b Source # (.>) :: StateT s m a -> StateT s m b -> StateT s m b Source # (<.) :: StateT s m a -> StateT s m b -> StateT s m a Source # liftF2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c Source # |
(Apply m, Semigroup w) => Apply (WriterT w m) Source # | A 'WriterT w m' is not Applicative unless its w is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b Source # (.>) :: WriterT w m a -> WriterT w m b -> WriterT w m b Source # (<.) :: WriterT w m a -> WriterT w m b -> WriterT w m a Source # liftF2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c Source # |
Bind m => Apply (StateT s m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b Source # (.>) :: StateT s m a -> StateT s m b -> StateT s m b Source # (<.) :: StateT s m a -> StateT s m b -> StateT s m a Source # liftF2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c Source # |
(Apply m, Semigroup w) => Apply (WriterT w m) Source # | A 'WriterT w m' is not Applicative unless its w is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b Source # (.>) :: WriterT w m a -> WriterT w m b -> WriterT w m b Source # (<.) :: WriterT w m a -> WriterT w m b -> WriterT w m a Source # liftF2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c Source # |
Biapply p => Apply (Join p) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Apply f => Apply (Reverse f) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Reverse f (a -> b) -> Reverse f a -> Reverse f b Source # (.>) :: Reverse f a -> Reverse f b -> Reverse f b Source # (<.) :: Reverse f a -> Reverse f b -> Reverse f a Source # liftF2 :: (a -> b -> c) -> Reverse f a -> Reverse f b -> Reverse f c Source # |
Apply f => Apply (Static f a) Source # | |
Instance detailsDefined in Data.Semigroupoid.Static |
Apply ((->) m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class |
Semigroup c => Apply (K1 i c :: Type -> Type) Source # | A 'K1 i c' is not Applicative unless its c is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class |
(Apply f, Apply g) => Apply (f :*: g) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: (f :*: g) (a -> b) -> (f :*: g) a -> (f :*: g) b Source # (.>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b Source # (<.) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) a Source # liftF2 :: (a -> b -> c) -> (f :*: g) a -> (f :*: g) b -> (f :*: g) c Source # |
(Apply f, Apply g) => Apply (Product f g) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Product f g (a -> b) -> Product f g a -> Product f g b Source # (.>) :: Product f g a -> Product f g b -> Product f g b Source # (<.) :: Product f g a -> Product f g b -> Product f g a Source # liftF2 :: (a -> b -> c) -> Product f g a -> Product f g b -> Product f g c Source # |
Apply (ContT r m) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: ContT r m (a -> b) -> ContT r m a -> ContT r m b Source # (.>) :: ContT r m a -> ContT r m b -> ContT r m b Source # (<.) :: ContT r m a -> ContT r m b -> ContT r m a Source # liftF2 :: (a -> b -> c) -> ContT r m a -> ContT r m b -> ContT r m c Source # |
Apply (Cokleisli w a) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Cokleisli w a (a0 -> b) -> Cokleisli w a a0 -> Cokleisli w a b Source # (.>) :: Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a b Source # (<.) :: Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a a0 Source # liftF2 :: (a0 -> b -> c) -> Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a c Source # |
Apply f => Apply (M1 i t f) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: M1 i t f (a -> b) -> M1 i t f a -> M1 i t f b Source # (.>) :: M1 i t f a -> M1 i t f b -> M1 i t f b Source # (<.) :: M1 i t f a -> M1 i t f b -> M1 i t f a Source # liftF2 :: (a -> b -> c) -> M1 i t f a -> M1 i t f b -> M1 i t f c Source # |
(Apply f, Apply g) => Apply (f :.: g) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: (f :.: g) (a -> b) -> (f :.: g) a -> (f :.: g) b Source # (.>) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) b Source # (<.) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) a Source # liftF2 :: (a -> b -> c) -> (f :.: g) a -> (f :.: g) b -> (f :.: g) c Source # |
(Apply f, Apply g) => Apply (Compose f g) Source # | |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: Compose f g (a -> b) -> Compose f g a -> Compose f g b Source # (.>) :: Compose f g a -> Compose f g b -> Compose f g b Source # (<.) :: Compose f g a -> Compose f g b -> Compose f g a Source # liftF2 :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c Source # |
(Bind m, Semigroup w) => Apply (RWST r w s m) Source # | An 'RWST r w s m' is not Applicative unless its w is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b Source # (.>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b Source # (<.) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a Source # liftF2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c Source # |
(Bind m, Semigroup w) => Apply (RWST r w s m) Source # | An 'RWST r w s m' is not Applicative unless its w is a Monoid , but it is an instance of Apply |
Instance detailsDefined in Data.Functor.Bind.Class Methods (<.>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b Source # (.>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b Source # (<.) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a Source # liftF2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c Source # |