| Safe Haskell | Safe | 
|---|---|
| Language | Haskell98 | 
Data.Functor.Compat
Documentation
module Data.Functor
class Functor (f :: Type -> Type) where #
The Functor class is used for types that can be mapped over.
Instances of Functor should satisfy the following laws:
fmap id == id fmap (f . g) == fmap f . fmap g
The instances of Functor for lists, Maybe and IO
satisfy these laws.
Minimal complete definition
Instances
| Functor [] | Since: base-2.1 | 
| Functor Maybe | Since: base-2.1 | 
| Functor IO | Since: base-2.1 | 
| Functor Complex | Since: base-4.9.0.0 | 
| Functor Min | Since: base-4.9.0.0 | 
| Functor Max | Since: base-4.9.0.0 | 
| Functor First | Since: base-4.9.0.0 | 
| Functor Last | Since: base-4.9.0.0 | 
| Functor Option | Since: base-4.9.0.0 | 
| Functor Identity | Since: base-4.8.0.0 | 
| Functor Handler | Since: base-4.6.0.0 | 
| Functor STM | Since: base-4.3.0.0 | 
| Functor First | Since: base-4.8.0.0 | 
| Functor Last | Since: base-4.8.0.0 | 
| Functor Dual | Since: base-4.8.0.0 | 
| Functor Sum | Since: base-4.8.0.0 | 
| Functor Product | Since: base-4.8.0.0 | 
| Functor ReadPrec | Since: base-2.1 | 
| Functor ReadP | Since: base-2.1 | 
| Functor NonEmpty | Since: base-4.9.0.0 | 
| Functor P | Since: base-4.8.0.0 | 
| Defined in Text.ParserCombinators.ReadP | |
| Functor (Either a) | Since: base-3.0 | 
| Functor ((,) a) | Since: base-2.1 | 
| Functor (Arg a) | Since: base-4.9.0.0 | 
| Functor (Proxy :: Type -> Type) | Since: base-4.7.0.0 | 
| Functor (Const m :: Type -> Type) | Since: base-2.1 | 
| Functor f => Functor (Ap f) | Since: base-4.12.0.0 | 
| Functor f => Functor (Alt f) | Since: base-4.8.0.0 | 
| Functor ((->) r :: Type -> Type) | Since: base-2.1 | 
| (Functor f, Functor g) => Functor (Product f g) | Since: base-4.9.0.0 | 
| (Functor f, Functor g) => Functor (Sum f g) | Since: base-4.9.0.0 | 
| (Functor f, Functor g) => Functor (Compose f g) | Since: base-4.9.0.0 | 
($>) :: Functor f => f a -> b -> f b infixl 4 #
Flipped version of <$.
Examples
Replace the contents of a Maybe IntString:
>>>Nothing $> "foo"Nothing>>>Just 90210 $> "foo"Just "foo"
Replace the contents of an Either Int IntString, resulting in an Either Int String
>>>Left 8675309 $> "foo"Left 8675309>>>Right 8675309 $> "foo"Right "foo"
Replace each element of a list with a constant String:
>>>[1,2,3] $> "foo"["foo","foo","foo"]
Replace the second element of a pair with a constant String:
>>>(1,2) $> "foo"(1,"foo")
Since: base-4.7.0.0
void :: Functor f => f a -> f () #
void valueIO action.
Examples
Replace the contents of a Maybe Int
>>>void NothingNothing>>>void (Just 3)Just ()
Replace the contents of an Either Int IntEither Int '()'
>>>void (Left 8675309)Left 8675309>>>void (Right 8675309)Right ()
Replace every element of a list with unit:
>>>void [1,2,3][(),(),()]
Replace the second element of a pair with unit:
>>>void (1,2)(1,())
Discard the result of an IO action:
>>>mapM print [1,2]1 2 [(),()]>>>void $ mapM print [1,2]1 2