Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- class Compactable (f :: * -> *) where
- fforMaybe :: (Compactable f, Functor f) => f a -> (a -> Maybe b) -> f b
- fforEither :: (Compactable f, Functor f) => f a -> (a -> Either l r) -> (f l, f r)
- class Compactable f => CompactFold (f :: * -> *) where
- fforFold :: (CompactFold f, Functor f, Foldable g) => f a -> (a -> g b) -> f b
- fforBifold :: (CompactFold f, Functor f, Bifoldable g) => f a -> (a -> g l r) -> (f l, f r)
Documentation
class Compactable (f :: * -> *) where #
Class Compactable
provides two methods which can be writen in terms of each other, compact and separate.
is generalization of catMaybes as a new function. Compact has relations with Functor, Applicative, Monad, Alternative, and Traversable. In that we can use these class to provide the ability to operate on a data type by throwing away intermediate Nothings. This is useful for representing stripping out values or failure.
To be compactable alone, no laws must be satisfied other than the type signature.
If the data type is also a Functor the following should hold:
- Kleisli composition
fmapMaybe (l <=< r) = fmapMaybe l . fmapMaybe r
- Functor identity 1
compact . fmap Just = id
- Functor identity 2
fmapMaybe Just = id
- Functor relation
compact = fmapMaybe id
According to Kmett, (Compactable f, Functor f) is a functor from the
kleisli category of Maybe to the category of haskell data types.
Kleisli Maybe -> Hask
.
If the data type is also Applicative the following should hold:
- Applicative left identity
compact . (pure Just <*>) = id
- Applicative right identity
applyMaybe (pure Just) = id
- Applicative relation
compact = applyMaybe (pure id)
If the data type is also a Monad the following should hold:
- Monad left identity
flip bindMaybe (return . Just) = id
- Monad right identity
compact . (return . Just =<<) = id
- Monad relation
compact = flip bindMaybe return
If the data type is also Alternative the following should hold:
- Alternative identity
compact empty = empty
- Alternative annihilation
compact (const Nothing <$> xs) = empty
If the data type is also Traversable the following should hold:
- Traversable Applicative relation
traverseMaybe (pure . Just) = pure
- Traversable composition
Compose . fmap (traverseMaybe f) . traverseMaybe g = traverseMaybe (Compose . fmap (traverseMaybe f) . g)
- Traversable Functor relation
traverse f = traverseMaybe (fmap Just . f)
- Traversable naturality
t . traverseMaybe f = traverseMaybe (t . f)
Separate and filter
have recently elevated roles in this typeclass, and is not as well explored as compact. Here are the laws known today:
- Functor identity 3
fst . separate . fmap Right = id
- Functor identity 4
snd . separate . fmap Left = id
- Applicative left identity 2
snd . separate . (pure Right <*>) = id
- Applicative right identity 2
fst . separate . (pure Left <*>) = id
- Alternative annihilation left
snd . separate . fmap (const Left) = empty
- Alternative annihilation right
fst , separate . fmap (const Right) = empty
Docs for relationships between these functions and, a cleanup of laws will happen at some point.
If you know of more useful laws, or have better names for the ones above (especially those marked "name me"). Please let me know.
compact :: f (Maybe a) -> f a #
separate :: f (Either l r) -> (f l, f r) #
filter :: (a -> Bool) -> f a -> f a #
partition :: (a -> Bool) -> f a -> (f a, f a) #
fmapMaybe :: Functor f => (a -> Maybe b) -> f a -> f b #
fmapEither :: Functor f => (a -> Either l r) -> f a -> (f l, f r) #
applyMaybe :: Applicative f => f (a -> Maybe b) -> f a -> f b #
applyEither :: Applicative f => f (a -> Either l r) -> f a -> (f l, f r) #
bindMaybe :: Monad f => f a -> (a -> f (Maybe b)) -> f b #
bindEither :: Monad f => f a -> (a -> f (Either l r)) -> (f l, f r) #
traverseMaybe :: (Applicative g, Traversable f) => (a -> g (Maybe b)) -> f a -> g (f b) #
traverseEither :: (Applicative g, Traversable f) => (a -> g (Either l r)) -> f a -> g (f l, f r) #
Instances
fforMaybe :: (Compactable f, Functor f) => f a -> (a -> Maybe b) -> f b #
fforEither :: (Compactable f, Functor f) => f a -> (a -> Either l r) -> (f l, f r) #
class Compactable f => CompactFold (f :: * -> *) where #
class CompactFold
provides the same methods as Compactable
but generalized to work on any Foldable
.
When a type has Alternative (or similar) properties, we can extract the Maybe and the Either, and generalize to Foldable and Bifoldable.
Compactable can always be described in terms of CompactFold, because
compact = compactFold
and
separate = separateFold
as it's just a specialization. More exploration is needed on the relationship here.
compactFold :: Foldable g => f (g a) -> f a #
separateFold :: Bifoldable g => f (g a b) -> (f a, f b) #
fmapFold :: (Functor f, Foldable g) => (a -> g b) -> f a -> f b #
fmapBifold :: (Functor f, Bifoldable g) => (a -> g l r) -> f a -> (f l, f r) #
applyFold :: (Applicative f, Foldable g) => f (a -> g b) -> f a -> f b #
applyBifold :: (Applicative f, Bifoldable g) => f (a -> g l r) -> f a -> (f l, f r) #
bindFold :: (Monad f, Foldable g) => f a -> (a -> f (g b)) -> f b #
bindBifold :: (Monad f, Bifoldable g) => f a -> (a -> f (g l r)) -> (f l, f r) #
traverseFold :: (Applicative h, Foldable g, Traversable f) => (a -> h (g b)) -> f a -> h (f b) #
traverseBifold :: (Applicative h, Bifoldable g, Traversable f) => (a -> h (g l r)) -> f a -> h (f l, f r) #
Instances
fforFold :: (CompactFold f, Functor f, Foldable g) => f a -> (a -> g b) -> f b #
fforBifold :: (CompactFold f, Functor f, Bifoldable g) => f a -> (a -> g l r) -> (f l, f r) #