Applicative Complex Source # | Since: base-4.9.0.0 |
Instance detailsDefined in Data.Complex |
Applicative First Source # | Since: base-4.9.0.0 |
Instance detailsDefined in Data.Semigroup |
Applicative Last Source # | Since: base-4.9.0.0 |
Instance detailsDefined in Data.Semigroup |
Applicative Max Source # | Since: base-4.9.0.0 |
Instance detailsDefined in Data.Semigroup |
Applicative Min Source # | Since: base-4.9.0.0 |
Instance detailsDefined in Data.Semigroup |
Applicative Get Source # | |
Instance detailsDefined in Data.Binary.Get.Internal |
Applicative PutM Source # | |
Instance detailsDefined in Data.Binary.Put |
Applicative Put Source # | |
Instance detailsDefined in Data.ByteString.Builder.Internal |
Applicative Seq Source # | Since: containers-0.5.4 |
Instance detailsDefined in Data.Sequence.Internal |
Applicative Tree Source # | |
Instance detailsDefined in Data.Tree |
Applicative Opt Source # | |
Instance detailsDefined in GHC.Cmm.Opt |
Applicative PD Source # | |
Instance detailsDefined in GHC.Cmm.Parser.Monad |
Applicative NatM Source # | |
Instance detailsDefined in GHC.CmmToAsm.Monad |
Applicative LlvmM Source # | |
Instance detailsDefined in GHC.CmmToLlvm.Base |
Applicative CoreM Source # | |
Instance detailsDefined in GHC.Core.Opt.Monad |
Applicative SimplM Source # | |
Instance detailsDefined in GHC.Core.Opt.Simplify.Monad |
Applicative UnifyResultM Source # | |
Instance detailsDefined in GHC.Core.Unify |
Applicative NullCollapseViz Source # | |
Instance detailsDefined in GHC.Data.Graph.Collapse |
Applicative Infinite Source # | |
Instance detailsDefined in GHC.Data.List.Infinite |
Applicative Pair Source # | |
Instance detailsDefined in GHC.Data.Pair |
Applicative Maybe Source # | |
Instance detailsDefined in GHC.Data.Strict |
Applicative Hsc Source # | |
Instance detailsDefined in GHC.Driver.Env.Types |
Applicative Ghc Source # | |
Instance detailsDefined in GHC.Driver.Monad |
Applicative HookedUse Source # | |
Instance detailsDefined in GHC.Driver.Pipeline.Execute |
Applicative MatchResult Source # | Product is an "or" on fallibility---the combined match result is infallible
only if the left and right argument match results both were. This is useful for combining a bunch of alternatives together and then
getting the overall fallibility of the entire group. See mkDataConCase for
an example. |
Instance detailsDefined in GHC.HsToCore.Monad |
Applicative P Source # | |
Instance detailsDefined in GHC.Parser.Lexer |
Applicative PV Source # | |
Instance detailsDefined in GHC.Parser.PostProcess |
Applicative CpsRn Source # | |
Instance detailsDefined in GHC.Rename.Pat |
Applicative LiftM Source # | |
Instance detailsDefined in GHC.Stg.Lift.Monad |
Applicative CmmParse Source # | |
Instance detailsDefined in GHC.StgToCmm.ExtCode |
Applicative FCode Source # | |
Instance detailsDefined in GHC.StgToCmm.Monad |
Applicative SolverStage Source # | |
Instance detailsDefined in GHC.Tc.Solver.Monad |
Applicative TcS Source # | |
Instance detailsDefined in GHC.Tc.Solver.Monad |
Applicative TcPluginM Source # | |
Instance detailsDefined in GHC.Tc.Types |
Applicative ZonkM Source # | |
Instance detailsDefined in GHC.Tc.Zonk.Monad |
Applicative UniqDSM Source # | |
Instance detailsDefined in GHC.Types.Unique.DSM |
Applicative UniqSM Source # | |
Instance detailsDefined in GHC.Types.Unique.Supply |
Applicative PprM Source # | |
Instance detailsDefined in GHC.Internal.TH.PprLib |
Applicative NonEmpty # | |
Instance detailsDefined in GHC.Internal.Base |
Applicative STM # | |
Instance detailsDefined in GHC.Internal.Conc.Sync |
Applicative Identity # | |
Instance detailsDefined in GHC.Internal.Data.Functor.Identity |
Applicative First # | |
Instance detailsDefined in GHC.Internal.Data.Monoid |
Applicative Last # | |
Instance detailsDefined in GHC.Internal.Data.Monoid |
Applicative Down # | |
Instance detailsDefined in GHC.Internal.Data.Ord |
Applicative Dual # | |
Instance detailsDefined in GHC.Internal.Data.Semigroup.Internal |
Applicative Product # | |
Instance detailsDefined in GHC.Internal.Data.Semigroup.Internal |
Applicative Sum # | |
Instance detailsDefined in GHC.Internal.Data.Semigroup.Internal |
Applicative ZipList # | |
Instance detailsDefined in GHC.Internal.Functor.ZipList |
Applicative Par1 # | |
Instance detailsDefined in GHC.Internal.Generics |
Applicative Q # | |
Instance detailsDefined in GHC.Internal.TH.Syntax Methods pure :: a -> Q a # (<*>) :: Q (a -> b) -> Q a -> Q b # liftA2 :: (a -> b -> c) -> Q a -> Q b -> Q c # (*>) :: Q a -> Q b -> Q b # (<*) :: Q a -> Q b -> Q a # |
Applicative P # | |
Instance detailsDefined in GHC.Internal.Text.ParserCombinators.ReadP Methods pure :: a -> P a # (<*>) :: P (a -> b) -> P a -> P b # liftA2 :: (a -> b -> c) -> P a -> P b -> P c # (*>) :: P a -> P b -> P b # (<*) :: P a -> P b -> P a # |
Applicative ReadP # | |
Instance detailsDefined in GHC.Internal.Text.ParserCombinators.ReadP |
Applicative ReadPrec # | |
Instance detailsDefined in GHC.Internal.Text.ParserCombinators.ReadPrec |
Applicative IO # | |
Instance detailsDefined in GHC.Internal.Base |
Applicative GHCiQ Source # | |
Instance detailsDefined in GHCi.TH Methods pure :: a -> GHCiQ a # (<*>) :: GHCiQ (a -> b) -> GHCiQ a -> GHCiQ b # liftA2 :: (a -> b -> c) -> GHCiQ a -> GHCiQ b -> GHCiQ c # (*>) :: GHCiQ a -> GHCiQ b -> GHCiQ b # (<*) :: GHCiQ a -> GHCiQ b -> GHCiQ a # |
Applicative Maybe # | |
Instance detailsDefined in GHC.Internal.Base |
Applicative Solo # | |
Instance detailsDefined in GHC.Internal.Base |
Applicative [] # | |
Instance detailsDefined in GHC.Internal.Base Methods pure :: a -> [a] # (<*>) :: [a -> b] -> [a] -> [b] # liftA2 :: (a -> b -> c) -> [a] -> [b] -> [c] # (*>) :: [a] -> [b] -> [b] # (<*) :: [a] -> [b] -> [a] # |
Monad m => Applicative (WrappedMonad m) Source # | Since: base-2.1 |
Instance detailsDefined in Control.Applicative |
Applicative (SetM s) Source # | |
Instance detailsDefined in Data.Graph Methods pure :: a -> SetM s a # (<*>) :: SetM s (a -> b) -> SetM s a -> SetM s b # liftA2 :: (a -> b -> c) -> SetM s a -> SetM s b -> SetM s c # (*>) :: SetM s a -> SetM s b -> SetM s b # (<*) :: SetM s a -> SetM s b -> SetM s a # |
Monad m => Applicative (CatchT m) Source # | |
Instance detailsDefined in Control.Monad.Catch.Pure |
Applicative (RegM freeRegs) Source # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Linear.State |
Applicative (WasmCodeGenM w) Source # | |
Instance detailsDefined in GHC.CmmToAsm.Wasm.Types |
Applicative (IOEnv m) Source # | |
Instance detailsDefined in GHC.Data.IOEnv |
Applicative (MaybeErr err) Source # | |
Instance detailsDefined in GHC.Data.Maybe |
Monad m => Applicative (EwM m) Source # | |
Instance detailsDefined in GHC.Driver.CmdLine |
Applicative m => Applicative (GhcT m) Source # | |
Instance detailsDefined in GHC.Driver.Monad |
Applicative (CmdLineP s) Source # | |
Instance detailsDefined in GHC.Driver.Session |
Applicative (PuResult a) Source # | |
Instance detailsDefined in GHC.Tc.Utils.Unify |
Applicative (ZonkBndrT m) Source # | |
Instance detailsDefined in GHC.Tc.Zonk.Env |
Applicative m => Applicative (ZonkT m) Source # | |
Instance detailsDefined in GHC.Tc.Zonk.Env |
Monad m => Applicative (UniqDSMT m) Source # | |
Instance detailsDefined in GHC.Types.Unique.DSM |
Applicative (Codensity f) Source # | |
Instance detailsDefined in GHC.Utils.Monad.Codensity |
Applicative (State s) Source # | |
Instance detailsDefined in GHC.Utils.Monad.State.Strict |
Arrow a => Applicative (ArrowMonad a) # | |
Instance detailsDefined in GHC.Internal.Control.Arrow |
Applicative (Either e) # | |
Instance detailsDefined in GHC.Internal.Data.Either |
Applicative (Proxy :: Type -> Type) # | |
Instance detailsDefined in GHC.Internal.Data.Proxy |
Applicative (U1 :: Type -> Type) # | |
Instance detailsDefined in GHC.Internal.Generics |
Applicative (ST s) # | |
Instance detailsDefined in GHC.Internal.ST |
Applicative f => Applicative (Lift f) Source # | A combination is Pure only if both parts are. |
Instance detailsDefined in Control.Applicative.Lift |
(Functor m, Monad m) => Applicative (MaybeT m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Maybe |
Monoid a => Applicative ((,) a) # | |
Instance detailsDefined in GHC.Internal.Base Methods pure :: a0 -> (a, a0) # (<*>) :: (a, a0 -> b) -> (a, a0) -> (a, b) # liftA2 :: (a0 -> b -> c) -> (a, a0) -> (a, b) -> (a, c) # (*>) :: (a, a0) -> (a, b) -> (a, b) # (<*) :: (a, a0) -> (a, b) -> (a, a0) # |
Arrow a => Applicative (WrappedArrow a b) Source # | Since: base-2.1 |
Instance detailsDefined in Control.Applicative |
(Applicative f, Monad f) => Applicative (WhenMissing f x) Source # | Equivalent to ReaderT k (ReaderT x (MaybeT f)) . Since: containers-0.5.9 |
Instance detailsDefined in Data.IntMap.Internal |
Applicative (Stream m a) Source # | |
Instance detailsDefined in GHC.Data.Stream |
Monad m => Applicative (StreamS m a) Source # | |
Instance detailsDefined in GHC.Data.Stream |
(Applicative f, Monad f) => Applicative (WhenMissing f x) Source # | Equivalent to ReaderT k (ReaderT x (MaybeT f)) . Since: ghc-0.5.9 |
Instance detailsDefined in GHC.Data.Word64Map.Internal |
Applicative m => Applicative (Kleisli m a) # | |
Instance detailsDefined in GHC.Internal.Control.Arrow |
Monoid m => Applicative (Const m :: Type -> Type) # | |
Instance detailsDefined in GHC.Internal.Data.Functor.Const |
Applicative f => Applicative (Ap f) # | |
Instance detailsDefined in GHC.Internal.Data.Monoid |
Applicative f => Applicative (Alt f) # | |
Instance detailsDefined in GHC.Internal.Data.Semigroup.Internal |
(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f) # | |
Instance detailsDefined in GHC.Internal.Generics |
Applicative f => Applicative (Rec1 f) # | |
Instance detailsDefined in GHC.Internal.Generics |
Applicative f => Applicative (Backwards f) Source # | Apply f -actions in the reverse order. |
Instance detailsDefined in Control.Applicative.Backwards |
(Monoid w, Functor m, Monad m) => Applicative (AccumT w m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Accum |
(Functor m, Monad m) => Applicative (ExceptT e m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Except |
Applicative m => Applicative (IdentityT m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Identity |
Applicative m => Applicative (ReaderT r m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Reader |
(Functor m, Monad m) => Applicative (SelectT r m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Select |
(Functor m, Monad m) => Applicative (StateT s m) Source # | |
Instance detailsDefined in Control.Monad.Trans.State.Lazy |
(Functor m, Monad m) => Applicative (StateT s m) Source # | |
Instance detailsDefined in Control.Monad.Trans.State.Strict |
(Functor m, Monad m) => Applicative (WriterT w m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Writer.CPS |
(Monoid w, Applicative m) => Applicative (WriterT w m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Writer.Lazy |
(Monoid w, Applicative m) => Applicative (WriterT w m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Writer.Strict |
Monoid a => Applicative (Constant a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Functor.Constant |
Applicative f => Applicative (Reverse f) Source # | Derived instance. |
Instance detailsDefined in Data.Functor.Reverse |
(Monoid a, Monoid b) => Applicative ((,,) a b) # | |
Instance detailsDefined in GHC.Internal.Base Methods pure :: a0 -> (a, b, a0) # (<*>) :: (a, b, a0 -> b0) -> (a, b, a0) -> (a, b, b0) # liftA2 :: (a0 -> b0 -> c) -> (a, b, a0) -> (a, b, b0) -> (a, b, c) # (*>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) # (<*) :: (a, b, a0) -> (a, b, b0) -> (a, b, a0) # |
(Applicative f, Applicative g) => Applicative (Product f g) Source # | Since: base-4.9.0.0 |
Instance detailsDefined in Data.Functor.Product |
(Monad f, Applicative f) => Applicative (WhenMatched f x y) Source # | Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f))) Since: containers-0.5.9 |
Instance detailsDefined in Data.IntMap.Internal |
(Applicative f, Monad f) => Applicative (WhenMissing f k x) Source # | Equivalent to ReaderT k (ReaderT x (MaybeT f)) . Since: containers-0.5.9 |
Instance detailsDefined in Data.Map.Internal |
(Monad f, Applicative f) => Applicative (WhenMatched f x y) Source # | Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f))) Since: ghc-0.5.9 |
Instance detailsDefined in GHC.Data.Word64Map.Internal |
(Applicative f, Applicative g) => Applicative (f :*: g) # | |
Instance detailsDefined in GHC.Internal.Generics |
Monoid c => Applicative (K1 i c :: Type -> Type) # | |
Instance detailsDefined in GHC.Internal.Generics |
Applicative (ContT r m) Source # | |
Instance detailsDefined in Control.Monad.Trans.Cont |
(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c) # | |
Instance detailsDefined in GHC.Internal.Base Methods pure :: a0 -> (a, b, c, a0) # (<*>) :: (a, b, c, a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) # liftA2 :: (a0 -> b0 -> c0) -> (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, c0) # (*>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) # (<*) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, a0) # |
Applicative ((->) r) # | |
Instance detailsDefined in GHC.Internal.Base Methods pure :: a -> r -> a # (<*>) :: (r -> (a -> b)) -> (r -> a) -> r -> b # liftA2 :: (a -> b -> c) -> (r -> a) -> (r -> b) -> r -> c # (*>) :: (r -> a) -> (r -> b) -> r -> b # (<*) :: (r -> a) -> (r -> b) -> r -> a # |
(Applicative f, Applicative g) => Applicative (Compose f g) Source # | Since: base-4.9.0.0 |
Instance detailsDefined in Data.Functor.Compose |
(Monad f, Applicative f) => Applicative (WhenMatched f k x y) Source # | Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f))) Since: containers-0.5.9 |
Instance detailsDefined in Data.Map.Internal |
(Applicative f, Applicative g) => Applicative (f :.: g) # | |
Instance detailsDefined in GHC.Internal.Generics |
Applicative f => Applicative (M1 i c f) # | |
Instance detailsDefined in GHC.Internal.Generics |
(Functor m, Monad m) => Applicative (RWST r w s m) Source # | |
Instance detailsDefined in Control.Monad.Trans.RWS.CPS |
(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) Source # | |
Instance detailsDefined in Control.Monad.Trans.RWS.Lazy |
(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) Source # | |
Instance detailsDefined in Control.Monad.Trans.RWS.Strict |