<$> is:exact

base Prelude Control.Applicative Data.Functor, hedgehog Hedgehog.Internal.Prelude, ghc GHC.HsToCore.Monad GHC.Prelude.Basic GHC.Utils.Monad, semigroupoids Data.Functor.Apply Data.Functor.Bind, base-compat Prelude.Compat, comonad Control.Comonad, protolude Protolude Protolude.Functor, diagrams-lib Diagrams.Prelude, haskell-gi-base Data.GI.Base.ShortPrelude, relude Relude.Functor.Reexport, rio RIO.Prelude, base-prelude BasePrelude BasePrelude.Operators, turtle Turtle, shelly Shelly Shelly.Lifted Shelly.Pipe, classy-prelude ClassyPrelude, universum Universum.Functor.Reexport, Cabal-syntax Distribution.Compat.Prelude, github GitHub.Internal.Prelude, numhask NumHask.Prelude, basement Basement.Compat.Base Basement.Imports, foundation Foundation, ghc-lib-parser GHC.Prelude.Basic GHC.Utils.Monad, Agda Agda.Utils.Functor Agda.Utils.Monad, dimensional Numeric.Units.Dimensional.Prelude, rebase Rebase.Prelude, quaalude Essentials, configuration-tools Configuration.Utils.CommandLine, hledger Hledger.Cli.Script, mixed-types-num Numeric.MixedTypes.PreludeHiding, xmonad-contrib XMonad.Config.Prime, stack Stack.Prelude, incipit-base Incipit.Base, LambdaHack Game.LambdaHack.Core.Prelude, ghc-lib GHC.HsToCore.Monad, breakpoint Debug.Breakpoint.GhcFacade, cabal-install-solver Distribution.Solver.Compat.Prelude, loc Data.Loc.Internal.Prelude, yesod-paginator Yesod.Paginator.Prelude, distribution-opensuse OpenSuse.Prelude, faktory Faktory.Prelude, hledger-web Hledger.Web.Import, termonad Termonad.Prelude
An infix synonym for fmap. The name of this operator is an allusion to $. Note the similarities between their types:
($)  ::              (a -> b) ->   a ->   b
(<$>) :: Functor f => (a -> b) -> f a -> f b
Whereas $ is function application, <$> is function application lifted over a Functor.

Examples

Convert from a Maybe Int to a Maybe String using show:
>>> show <$> Nothing
Nothing

>>> show <$> Just 3
Just "3"
Convert from an Either Int Int to an Either Int String using show:
>>> show <$> Left 17
Left 17

>>> show <$> Right 17
Right "17"
Double each element of a list:
>>> (*2) <$> [1,2,3]
[2,4,6]
Apply even to the second element of a pair:
>>> even <$> (2,2)
(2,True)
An infix synonym for fmap. The name of this operator is an allusion to $. Note the similarities between their types:
($)  ::              (a -> b) ->   a ->   b
(<$>) :: Functor f => (a -> b) -> f a -> f b
Whereas $ is function application, <$> is function application lifted over a Functor.

Examples

Convert from a Maybe Int to a Maybe String using show:
>>> show <$> Nothing
Nothing

>>> show <$> Just 3
Just "3"
Convert from an Either Int Int to an Either Int String using show:
>>> show <$> Left 17
Left 17

>>> show <$> Right 17
Right "17"
Double each element of a list:
>>> (*2) <$> [1,2,3]
[2,4,6]
Apply even to the second element of a pair:
>>> even <$> (2,2)
(2,True)
The document (x <$> y) concatenates document x and y with a line in between. (infixr 5)
The document (x <$> y) concatenates document x and y with a line in between. (infixr 5)
An infix synnonym for fmap.
Apply a bijection over a IsoFunctor using <$>.
The document (x <$> y) concatenates document x and y with a line in between. (infixr 5)