|  Functor [] | Since: base-2.1  | 
Instance detailsDefined in GHC.Base  Methods fmap :: (a -> b) -> [a] -> [b] # (<$) :: a -> [b] -> [a] #  | 
|  Functor Maybe | Since: base-2.1  | 
Instance detailsDefined in GHC.Base   | 
|  Functor IO | Since: base-2.1  | 
Instance detailsDefined in GHC.Base   | 
|  Functor Par1 |   | 
Instance detailsDefined in GHC.Generics   | 
|  Functor Q |   | 
Instance detailsDefined in Language.Haskell.TH.Syntax   | 
|  Functor Complex |   | 
Instance detailsDefined in Data.Complex   | 
|  Functor Min | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Semigroup   | 
|  Functor Max | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Semigroup   | 
|  Functor First | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Semigroup   | 
|  Functor Last | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Semigroup   | 
|  Functor Option | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Semigroup   | 
|  Functor ZipList |   | 
Instance detailsDefined in Control.Applicative   | 
|  Functor Identity | Since: base-4.8.0.0  | 
Instance detailsDefined in Data.Functor.Identity   | 
|  Functor Handler | Since: base-4.6.0.0  | 
Instance detailsDefined in Control.Exception   | 
|  Functor STM | Since: base-4.3.0.0  | 
Instance detailsDefined in GHC.Conc.Sync   | 
|  Functor First |   | 
Instance detailsDefined in Data.Monoid   | 
|  Functor Last |   | 
Instance detailsDefined in Data.Monoid   | 
|  Functor Dual | Since: base-4.8.0.0  | 
Instance detailsDefined in Data.Semigroup.Internal   | 
|  Functor Sum | Since: base-4.8.0.0  | 
Instance detailsDefined in Data.Semigroup.Internal   | 
|  Functor Product | Since: base-4.8.0.0  | 
Instance detailsDefined in Data.Semigroup.Internal   | 
|  Functor Down | Since: base-4.11.0.0  | 
Instance detailsDefined in Data.Ord   | 
|  Functor ReadP | Since: base-2.1  | 
Instance detailsDefined in Text.ParserCombinators.ReadP   | 
|  Functor NonEmpty | Since: base-4.9.0.0  | 
Instance detailsDefined in GHC.Base   | 
|  Functor IntMap |   | 
Instance detailsDefined in Data.IntMap.Internal   | 
|  Functor Tree |   | 
Instance detailsDefined in Data.Tree   | 
|  Functor Seq |   | 
Instance detailsDefined in Data.Sequence.Internal   | 
|  Functor FingerTree |   | 
Instance detailsDefined in Data.Sequence.Internal   | 
|  Functor Digit |   | 
Instance detailsDefined in Data.Sequence.Internal   | 
|  Functor Node |   | 
Instance detailsDefined in Data.Sequence.Internal   | 
|  Functor Elem |   | 
Instance detailsDefined in Data.Sequence.Internal   | 
|  Functor ViewL |   | 
Instance detailsDefined in Data.Sequence.Internal   | 
|  Functor ViewR |   | 
Instance detailsDefined in Data.Sequence.Internal   | 
|  Functor Doc |   | 
Instance detailsDefined in Text.PrettyPrint.Annotated.HughesPJ   | 
|  Functor AnnotDetails |   | 
Instance detailsDefined in Text.PrettyPrint.Annotated.HughesPJ   | 
|  Functor Span |   | 
Instance detailsDefined in Text.PrettyPrint.Annotated.HughesPJ   | 
|  Functor P |   | 
Instance detailsDefined in Text.ParserCombinators.ReadP  Methods fmap :: (a -> b) -> P a -> P b # (<$) :: a -> P b -> P a #  | 
|  Functor (Either a) | Since: base-3.0  | 
Instance detailsDefined in Data.Either   | 
|  Functor (V1 :: * -> *) | Since: base-4.9.0.0  | 
Instance detailsDefined in GHC.Generics   | 
|  Functor (U1 :: * -> *) | Since: base-4.9.0.0  | 
Instance detailsDefined in GHC.Generics   | 
|  Functor ((,) a) | Since: base-2.1  | 
Instance detailsDefined in GHC.Base  Methods fmap :: (a0 -> b) -> (a, a0) -> (a, b) # (<$) :: a0 -> (a, b) -> (a, a0) #  | 
|  Functor (Array i) | Since: base-2.1  | 
Instance detailsDefined in GHC.Arr   | 
|  Functor (Arg a) | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Semigroup   | 
|  Monad m => Functor (WrappedMonad m) | Since: base-2.1  | 
Instance detailsDefined in Control.Applicative   | 
|  Arrow a => Functor (ArrowMonad a) | Since: base-4.6.0.0  | 
Instance detailsDefined in Control.Arrow   | 
|  Functor (Proxy :: * -> *) | Since: base-4.7.0.0  | 
Instance detailsDefined in Data.Proxy   | 
|  Functor (Map k) |   | 
Instance detailsDefined in Data.Map.Internal   | 
|  Functor f => Functor (Lift f) |   | 
Instance detailsDefined in Control.Applicative.Lift   | 
|  Functor m => Functor (MaybeT m) |   | 
Instance detailsDefined in Control.Monad.Trans.Maybe   | 
|  Functor m => Functor (ListT m) |   | 
Instance detailsDefined in Control.Monad.Trans.List   | 
|  Functor (HashMap k) |   | 
Instance detailsDefined in Data.HashMap.Base   | 
|  Functor f => Functor (MaybeApply f) # |   | 
Instance detailsDefined in Data.Functor.Bind.Class   | 
|  Functor f => Functor (WrappedApplicative f) # |   | 
Instance detailsDefined in Data.Functor.Bind.Class   | 
|  Functor f => Functor (Rec1 f) |   | 
Instance detailsDefined in GHC.Generics   | 
|  Functor (URec Char :: * -> *) |   | 
Instance detailsDefined in GHC.Generics   | 
|  Functor (URec Double :: * -> *) |   | 
Instance detailsDefined in GHC.Generics   | 
|  Functor (URec Float :: * -> *) |   | 
Instance detailsDefined in GHC.Generics   | 
|  Functor (URec Int :: * -> *) |   | 
Instance detailsDefined in GHC.Generics   | 
|  Functor (URec Word :: * -> *) |   | 
Instance detailsDefined in GHC.Generics   | 
|  Functor (URec (Ptr ()) :: * -> *) |   | 
Instance detailsDefined in GHC.Generics   | 
|  Arrow a => Functor (WrappedArrow a b) | Since: base-2.1  | 
Instance detailsDefined in Control.Applicative   | 
|  Functor (Const m :: * -> *) | Since: base-2.1  | 
Instance detailsDefined in Data.Functor.Const   | 
|  Functor f => Functor (Alt f) |   | 
Instance detailsDefined in Data.Semigroup.Internal   | 
|  Bifunctor p => Functor (Join p) |   | 
Instance detailsDefined in Data.Bifunctor.Join   | 
|  Functor w => Functor (TracedT m w) |   | 
Instance detailsDefined in Control.Comonad.Trans.Traced   | 
|  Functor w => Functor (StoreT s w) |   | 
Instance detailsDefined in Control.Comonad.Trans.Store   | 
|  Functor w => Functor (EnvT e w) |   | 
Instance detailsDefined in Control.Comonad.Trans.Env   | 
|  Functor m => Functor (IdentityT m) |   | 
Instance detailsDefined in Control.Monad.Trans.Identity   | 
|  (Applicative f, Monad f) => Functor (WhenMissing f x) | Since: containers-0.5.9  | 
Instance detailsDefined in Data.IntMap.Internal   | 
|  Functor (Tagged s) |   | 
Instance detailsDefined in Data.Tagged   | 
|  Functor f => Functor (Reverse f) | Derived instance.  | 
Instance detailsDefined in Data.Functor.Reverse   | 
|  Functor (Constant a :: * -> *) |   | 
Instance detailsDefined in Data.Functor.Constant   | 
|  Functor m => Functor (WriterT w m) |   | 
Instance detailsDefined in Control.Monad.Trans.Writer.Strict   | 
|  Functor m => Functor (WriterT w m) |   | 
Instance detailsDefined in Control.Monad.Trans.Writer.Lazy   | 
|  Functor m => Functor (StateT s m) |   | 
Instance detailsDefined in Control.Monad.Trans.State.Strict   | 
|  Functor m => Functor (StateT s m) |   | 
Instance detailsDefined in Control.Monad.Trans.State.Lazy   | 
|  Functor m => Functor (ExceptT e m) |   | 
Instance detailsDefined in Control.Monad.Trans.Except   | 
|  Functor m => Functor (ErrorT e m) |   | 
Instance detailsDefined in Control.Monad.Trans.Error   | 
|  Functor f => Functor (Backwards f) | Derived instance.  | 
Instance detailsDefined in Control.Applicative.Backwards   | 
|  Functor f => Functor (Static f a) # |   | 
Instance detailsDefined in Data.Semigroupoid.Static   | 
|  Functor ((->) r :: * -> *) | Since: base-2.1  | 
Instance detailsDefined in GHC.Base  Methods fmap :: (a -> b) -> (r -> a) -> r -> b # (<$) :: a -> (r -> b) -> r -> a #  | 
|  Functor (K1 i c :: * -> *) |   | 
Instance detailsDefined in GHC.Generics   | 
|  (Functor f, Functor g) => Functor (f :+: g) |   | 
Instance detailsDefined in GHC.Generics   | 
|  (Functor f, Functor g) => Functor (f :*: g) |   | 
Instance detailsDefined in GHC.Generics   | 
|  (Functor f, Functor g) => Functor (Product f g) | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Functor.Product   | 
|  (Functor f, Functor g) => Functor (Sum f g) | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Functor.Sum   | 
|  Functor (Cokleisli w a) |   | 
Instance detailsDefined in Control.Comonad   | 
|  Functor f => Functor (WhenMatched f x y) | Since: containers-0.5.9  | 
Instance detailsDefined in Data.IntMap.Internal   | 
|  (Applicative f, Monad f) => Functor (WhenMissing f k x) | Since: containers-0.5.9  | 
Instance detailsDefined in Data.Map.Internal   | 
|  Functor m => Functor (ReaderT r m) |   | 
Instance detailsDefined in Control.Monad.Trans.Reader   | 
|  Functor (ContT r m) |   | 
Instance detailsDefined in Control.Monad.Trans.Cont   | 
|  Functor f => Functor (M1 i c f) |   | 
Instance detailsDefined in GHC.Generics  Methods fmap :: (a -> b) -> M1 i c f a -> M1 i c f b # (<$) :: a -> M1 i c f b -> M1 i c f a #  | 
|  (Functor f, Functor g) => Functor (f :.: g) |   | 
Instance detailsDefined in GHC.Generics   | 
|  (Functor f, Functor g) => Functor (Compose f g) | Since: base-4.9.0.0  | 
Instance detailsDefined in Data.Functor.Compose   | 
|  Bifunctor p => Functor (WrappedBifunctor p a) |   | 
Instance detailsDefined in Data.Bifunctor.Wrapped   | 
|  Functor g => Functor (Joker g a) |   | 
Instance detailsDefined in Data.Bifunctor.Joker   | 
|  Bifunctor p => Functor (Flip p a) |   | 
Instance detailsDefined in Data.Bifunctor.Flip   | 
|  Functor (Clown f a :: * -> *) |   | 
Instance detailsDefined in Data.Bifunctor.Clown   | 
|  Functor f => Functor (WhenMatched f k x y) | Since: containers-0.5.9  | 
Instance detailsDefined in Data.Map.Internal   | 
|  Functor m => Functor (RWST r w s m) |   | 
Instance detailsDefined in Control.Monad.Trans.RWS.Strict   | 
|  Functor m => Functor (RWST r w s m) |   | 
Instance detailsDefined in Control.Monad.Trans.RWS.Lazy   | 
|  (Functor f, Bifunctor p) => Functor (Tannen f p a) |   | 
Instance detailsDefined in Data.Bifunctor.Tannen   | 
|  (Bifunctor p, Functor g) => Functor (Biff p f g a) |   | 
Instance detailsDefined in Data.Bifunctor.Biff   |