mono-traversable-0.10.1: Type classes for mapping, folding, and traversing monomorphic containers

Safe HaskellNone
LanguageHaskell2010

Data.MonoTraversable

Description

Type classes mirroring standard typeclasses, but working with monomorphic containers.

The motivation is that some commonly used data types (i.e., ByteString and Text) do not allow for instances of typeclasses like Functor and Foldable, since they are monomorphic structures. This module allows both monomorphic and polymorphic data types to be instances of the same typeclasses.

All of the laws for the polymorphic typeclasses apply to their monomorphic cousins. Thus, even though a MonoFunctor instance for Set could theoretically be defined, it is omitted since it could violate the functor law of omap f . omap g = omap (f . g).

Note that all typeclasses have been prefixed with Mono, and functions have been prefixed with o. The mnemonic for o is "only one", or alternatively "it's mono, but m is overused in Haskell, so we'll use the second letter instead." (Agreed, it's not a great mangling scheme, input is welcome!)

Synopsis

Documentation

type family Element mono Source

Type family for getting the type of the elements of a monomorphic container.

Instances

type Element ByteString = Word8 Source 
type Element ByteString = Word8 Source 
type Element IntSet = Int Source 
type Element Text = Char Source 
type Element Text = Char Source 
type Element [a] = a Source 
type Element (IO a) = a Source 
type Element (Identity a) = a Source 
type Element (ZipList a) = a Source 
type Element (Maybe a) = a Source 
type Element (IntMap a) = a Source 
type Element (Set e) = e Source 
type Element (Tree a) = a Source 
type Element (Seq a) = a Source 
type Element (ViewL a) = a Source 
type Element (ViewR a) = a Source 
type Element (DList a) = a Source 
type Element (Option a) = a Source 
type Element (NonEmpty a) = a Source 
type Element (HashSet e) = e Source 
type Element (Vector a) = a Source 
type Element (Vector a) = a Source 
type Element (Vector a) = a Source 
type Element (r -> a) = a Source 
type Element (Either a b) = b Source 
type Element (a, b) = b Source 
type Element (Const m a) = a Source 
type Element (WrappedMonad m a) = a Source 
type Element (IdentityT m a) = a Source 
type Element (Map k v) = v Source 
type Element (ListT m a) = a Source 
type Element (WrappedApplicative f a) = a Source 
type Element (MaybeApply f a) = a Source 
type Element (Arg a b) = b Source 
type Element (MaybeT m a) = a Source 
type Element (HashMap k v) = v Source 
type Element (MinLen nat mono) = Element mono Source 
type Element (WrappedArrow a b c) = c Source 
type Element (TracedT m w a) = a Source 
type Element (StoreT s w a) = a Source 
type Element (EnvT e w a) = a Source 
type Element (Cokleisli w a b) = b Source 
type Element (ContT r m a) = a Source 
type Element (ReaderT r m a) = a Source 
type Element (StateT s m a) = a Source 
type Element (StateT s m a) = a Source 
type Element (ErrorT e m a) = a Source 
type Element (WriterT w m a) = a Source 
type Element (WriterT w m a) = a Source 
type Element (Compose f g a) = a Source 
type Element (Static f a b) = b Source 
type Element (Product f g a) = a Source 
type Element (RWST r w s m a) = a Source 
type Element (RWST r w s m a) = a Source 

class MonoFunctor mono where Source

Monomorphic containers that can be mapped over.

Minimal complete definition

Nothing

Methods

omap :: (Element mono -> Element mono) -> mono -> mono Source

Map over a monomorphic container

Instances

MonoFunctor ByteString Source 
MonoFunctor ByteString Source 
MonoFunctor Text Source 
MonoFunctor Text Source 
MonoFunctor [a] Source 
MonoFunctor (IO a) Source 
MonoFunctor (Identity a) Source 
MonoFunctor (ZipList a) Source 
MonoFunctor (Maybe a) Source 
MonoFunctor (IntMap a) Source 
MonoFunctor (Tree a) Source 
MonoFunctor (Seq a) Source 
MonoFunctor (ViewL a) Source 
MonoFunctor (ViewR a) Source 
MonoFunctor (DList a) Source 
MonoFunctor (Option a) Source 
MonoFunctor (NonEmpty a) Source 
MonoFunctor (Vector a) Source 
Unbox a => MonoFunctor (Vector a) Source 
Storable a => MonoFunctor (Vector a) Source 
MonoFunctor (r -> a) Source 
MonoFunctor (Either a b) Source 
MonoFunctor (a, b) Source 
MonoFunctor (Const m a) Source 
Monad m => MonoFunctor (WrappedMonad m a) Source 
Functor m => MonoFunctor (IdentityT m a) Source 
MonoFunctor (Map k v) Source 
Functor m => MonoFunctor (ListT m a) Source 
Functor f => MonoFunctor (WrappedApplicative f a) Source 
Functor f => MonoFunctor (MaybeApply f a) Source 
MonoFunctor (Arg a b) Source 
Functor m => MonoFunctor (MaybeT m a) Source 
MonoFunctor (HashMap k v) Source 
MonoFunctor mono => MonoFunctor (MinLen nat mono) Source 
Arrow a => MonoFunctor (WrappedArrow a b c) Source 
Functor w => MonoFunctor (TracedT m w a) Source 
Functor w => MonoFunctor (StoreT s w a) Source 
Functor w => MonoFunctor (EnvT e w a) Source 
MonoFunctor (Cokleisli w a b) Source 
Functor m => MonoFunctor (ContT r m a) Source 
Functor m => MonoFunctor (ReaderT r m a) Source 
Functor m => MonoFunctor (StateT s m a) Source 
Functor m => MonoFunctor (StateT s m a) Source 
Functor m => MonoFunctor (ErrorT e m a) Source 
Functor m => MonoFunctor (WriterT w m a) Source 
Functor m => MonoFunctor (WriterT w m a) Source 
(Functor f, Functor g) => MonoFunctor (Compose f g a) Source 
Functor f => MonoFunctor (Static f a b) Source 
(Functor f, Functor g) => MonoFunctor (Product f g a) Source 
Functor m => MonoFunctor (RWST r w s m a) Source 
Functor m => MonoFunctor (RWST r w s m a) Source 

class MonoFoldable mono where Source

Monomorphic containers that can be folded.

Minimal complete definition

Nothing

Methods

ofoldMap :: Monoid m => (Element mono -> m) -> mono -> m Source

Map each element of a monomorphic container to a Monoid and combine the results.

ofoldr :: (Element mono -> b -> b) -> b -> mono -> b Source

Right-associative fold of a monomorphic container.

ofoldl' :: (a -> Element mono -> a) -> a -> mono -> a Source

Strict left-associative fold of a monomorphic container.

otoList :: mono -> [Element mono] Source

Convert a monomorphic container to a list.

oall :: (Element mono -> Bool) -> mono -> Bool Source

Are all of the elements in a monomorphic container converted to booleans True?

oany :: (Element mono -> Bool) -> mono -> Bool Source

Are any of the elements in a monomorphic container converted to booleans True?

onull :: mono -> Bool Source

Is the monomorphic container empty?

olength :: mono -> Int Source

Length of a monomorphic container, returns a Int.

olength64 :: mono -> Int64 Source

Length of a monomorphic container, returns a Int64.

ocompareLength :: Integral i => mono -> i -> Ordering Source

Compare the length of a monomorphic container and a given number.

otraverse_ :: (MonoFoldable mono, Applicative f) => (Element mono -> f b) -> mono -> f () Source

Map each element of a monomorphic container to an action, evaluate these actions from left to right, and ignore the results.

ofor_ :: (MonoFoldable mono, Applicative f) => mono -> (Element mono -> f b) -> f () Source

ofor_ is otraverse_ with its arguments flipped.

omapM_ :: (MonoFoldable mono, Monad m) => (Element mono -> m ()) -> mono -> m () Source

Map each element of a monomorphic container to a monadic action, evaluate these actions from left to right, and ignore the results.

oforM_ :: (MonoFoldable mono, Monad m) => mono -> (Element mono -> m ()) -> m () Source

oforM_ is omapM_ with its arguments flipped.

ofoldlM :: (MonoFoldable mono, Monad m) => (a -> Element mono -> m a) -> a -> mono -> m a Source

Monadic fold over the elements of a monomorphic container, associating to the left.

ofoldMap1Ex :: Semigroup m => (Element mono -> m) -> mono -> m Source

Map each element of a monomorphic container to a semigroup, and combine the results.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See ofoldMap1 from Data.MinLen for a total version of this function.

ofoldr1Ex :: (Element mono -> Element mono -> Element mono) -> mono -> Element mono Source

Right-associative fold of a monomorphic container with no base element.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See ofoldr1Ex from Data.MinLen for a total version of this function.

ofoldl1Ex' :: (Element mono -> Element mono -> Element mono) -> mono -> Element mono Source

Strict left-associative fold of a monomorphic container with no base element.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See ofoldl1Ex' from Data.MinLen for a total version of this function.

headEx :: mono -> Element mono Source

Get the first element of a monomorphic container.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See head from Data.MinLen for a total version of this function.

lastEx :: mono -> Element mono Source

Get the last element of a monomorphic container.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See 'Data.MinLen.last from Data.MinLen for a total version of this function.

unsafeHead :: mono -> Element mono Source

Equivalent to headEx.

unsafeLast :: mono -> Element mono Source

Equivalent to lastEx.

maximumByEx :: (Element mono -> Element mono -> Ordering) -> mono -> Element mono Source

Get the maximum element of a monomorphic container, using a supplied element ordering function.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See maximiumBy from Data.MinLen for a total version of this function.

minimumByEx :: (Element mono -> Element mono -> Ordering) -> mono -> Element mono Source

Get the minimum element of a monomorphic container, using a supplied element ordering function.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See minimumBy from Data.MinLen for a total version of this function.

headMay :: MonoFoldable mono => mono -> Maybe (Element mono) Source

Safe version of headEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

lastMay :: MonoFoldable mono => mono -> Maybe (Element mono) Source

Safe version of lastEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

osum :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono Source

osum computes the sum of the numbers of a monomorphic container.

oproduct :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono Source

oproduct computes the product of the numbers of a monomorphic container.

oand :: (Element mono ~ Bool, MonoFoldable mono) => mono -> Bool Source

Are all of the elements True?

Since 0.6.0

oor :: (Element mono ~ Bool, MonoFoldable mono) => mono -> Bool Source

Are any of the elements True?

Since 0.6.0

class (MonoFoldable mono, Monoid mono) => MonoFoldableMonoid mono where Source

A typeclass for monomorphic containers that are Monoids.

Minimal complete definition

Nothing

Methods

oconcatMap :: (Element mono -> mono) -> mono -> mono Source

Map a function over a monomorphic container and combine the results.

class (MonoFoldable mono, Eq (Element mono)) => MonoFoldableEq mono where Source

A typeclass for monomorphic containers whose elements are an instance of Eq.

Minimal complete definition

Nothing

Methods

oelem :: Element mono -> mono -> Bool Source

Checks if the monomorphic container includes the supplied element.

onotElem :: Element mono -> mono -> Bool Source

Checks if the monomorphic container does not include the supplied element.

Instances

MonoFoldableEq ByteString Source 
MonoFoldableEq ByteString Source 
MonoFoldableEq IntSet Source 
MonoFoldableEq Text Source 
MonoFoldableEq Text Source 
Eq a => MonoFoldableEq [a] Source 
Eq a => MonoFoldableEq (Identity a) Source 
Eq a => MonoFoldableEq (Maybe a) Source 
Eq a => MonoFoldableEq (IntMap a) Source 
(Eq a, Ord a) => MonoFoldableEq (Set a) Source 
Eq a => MonoFoldableEq (Tree a) Source 
Eq a => MonoFoldableEq (Seq a) Source 
Eq a => MonoFoldableEq (ViewL a) Source 
Eq a => MonoFoldableEq (ViewR a) Source 
Eq a => MonoFoldableEq (DList a) Source 
Eq a => MonoFoldableEq (Option a) Source 
Eq a => MonoFoldableEq (NonEmpty a) Source 
Eq a => MonoFoldableEq (HashSet a) Source 
Eq a => MonoFoldableEq (Vector a) Source 
(Eq a, Unbox a) => MonoFoldableEq (Vector a) Source 
(Eq a, Storable a) => MonoFoldableEq (Vector a) Source 
Eq b => MonoFoldableEq (Either a b) Source 
Eq b => MonoFoldableEq (a, b) Source 
Eq a => MonoFoldableEq (Const m a) Source 
(Eq a, Foldable f) => MonoFoldableEq (IdentityT f a) Source 
Eq v => MonoFoldableEq (Map k v) Source 
(Eq a, Foldable f) => MonoFoldableEq (ListT f a) Source 
(Eq a, Foldable f) => MonoFoldableEq (MaybeT f a) Source 
Eq v => MonoFoldableEq (HashMap k v) Source 
MonoFoldableEq mono => MonoFoldableEq (MinLen nat mono) Source 
(Eq a, Foldable f) => MonoFoldableEq (ErrorT e f a) Source 
(Eq a, Foldable f) => MonoFoldableEq (WriterT w f a) Source 
(Eq a, Foldable f) => MonoFoldableEq (WriterT w f a) Source 
(Eq a, Foldable f, Foldable g) => MonoFoldableEq (Compose f g a) Source 
(Eq a, Foldable f, Foldable g) => MonoFoldableEq (Product f g a) Source 

class (MonoFoldable mono, Ord (Element mono)) => MonoFoldableOrd mono where Source

A typeclass for monomorphic containers whose elements are an instance of Ord.

Minimal complete definition

Nothing

Methods

maximumEx :: mono -> Element mono Source

Get the minimum element of a monomorphic container.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See maximum from Data.MinLen for a total version of this function.

minimumEx :: mono -> Element mono Source

Get the maximum element of a monomorphic container.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See minimum from Data.MinLen for a total version of this function.

Instances

MonoFoldableOrd ByteString Source 
MonoFoldableOrd ByteString Source 
MonoFoldableOrd IntSet Source 
MonoFoldableOrd Text Source 
MonoFoldableOrd Text Source 
Ord a => MonoFoldableOrd [a] Source 
Ord a => MonoFoldableOrd (Identity a) Source 
Ord a => MonoFoldableOrd (Maybe a) Source 
Ord a => MonoFoldableOrd (IntMap a) Source 
Ord e => MonoFoldableOrd (Set e) Source 
Ord a => MonoFoldableOrd (Tree a) Source 
Ord a => MonoFoldableOrd (Seq a) Source 
Ord a => MonoFoldableOrd (ViewL a) Source 
Ord a => MonoFoldableOrd (ViewR a) Source 
Ord a => MonoFoldableOrd (DList a) Source 
Ord a => MonoFoldableOrd (Option a) Source 
Ord a => MonoFoldableOrd (NonEmpty a) Source 
Ord e => MonoFoldableOrd (HashSet e) Source 
Ord a => MonoFoldableOrd (Vector a) Source 
(Unbox a, Ord a) => MonoFoldableOrd (Vector a) Source 
(Ord a, Storable a) => MonoFoldableOrd (Vector a) Source 
Ord b => MonoFoldableOrd (Either a b) Source 
Ord b => MonoFoldableOrd (a, b) Source 
Ord a => MonoFoldableOrd (Const m a) Source 
(Ord a, Foldable f) => MonoFoldableOrd (IdentityT f a) Source 
Ord v => MonoFoldableOrd (Map k v) Source 
(Ord a, Foldable f) => MonoFoldableOrd (ListT f a) Source 
(Ord a, Foldable f) => MonoFoldableOrd (MaybeT f a) Source 
Ord v => MonoFoldableOrd (HashMap k v) Source 
MonoFoldableOrd mono => MonoFoldableOrd (MinLen nat mono) Source 
(Ord a, Foldable f) => MonoFoldableOrd (ErrorT e f a) Source 
(Ord a, Foldable f) => MonoFoldableOrd (WriterT w f a) Source 
(Ord a, Foldable f) => MonoFoldableOrd (WriterT w f a) Source 
(Ord a, Foldable f, Foldable g) => MonoFoldableOrd (Compose f g a) Source 
(Ord a, Foldable f, Foldable g) => MonoFoldableOrd (Product f g a) Source 

maximumMay :: MonoFoldableOrd mono => mono -> Maybe (Element mono) Source

Safe version of maximumEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

maximumByMay :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> mono -> Maybe (Element mono) Source

Safe version of maximumByEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

minimumMay :: MonoFoldableOrd mono => mono -> Maybe (Element mono) Source

Safe version of minimumEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

minimumByMay :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> mono -> Maybe (Element mono) Source

Safe version of minimumByEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

class (MonoFunctor mono, MonoFoldable mono) => MonoTraversable mono where Source

Monomorphic containers that can be traversed from left to right.

Minimal complete definition

Nothing

Methods

otraverse :: Applicative f => (Element mono -> f (Element mono)) -> mono -> f mono Source

Map each element of a monomorphic container to an action, evaluate these actions from left to right, and collect the results.

omapM :: Monad m => (Element mono -> m (Element mono)) -> mono -> m mono Source

Map each element of a monomorphic container to a monadic action, evaluate these actions from left to right, and collect the results.

ofor :: (MonoTraversable mono, Applicative f) => mono -> (Element mono -> f (Element mono)) -> f mono Source

ofor is otraverse with its arguments flipped.

oforM :: (MonoTraversable mono, Monad f) => mono -> (Element mono -> f (Element mono)) -> f mono Source

oforM is omapM with its arguments flipped.

ofoldlUnwrap :: MonoFoldable mono => (x -> Element mono -> x) -> x -> (x -> b) -> mono -> b Source

A strict left fold, together with an unwrap function.

This is convenient when the accumulator value is not the same as the final expected type. It is provided mainly for integration with the foldl package, to be used in conjunction with purely.

Since 0.3.1

ofoldMUnwrap :: (Monad m, MonoFoldable mono) => (x -> Element mono -> m x) -> m x -> (x -> m b) -> mono -> m b Source

A monadic strict left fold, together with an unwrap function.

Similar to foldlUnwrap, but allows monadic actions. To be used with impurely from foldl.

Since 0.3.1

class MonoPointed mono where Source

Typeclass for monomorphic containers that an element can be lifted into.

For any MonoFunctor, the following law holds:

omap f . opoint = opoint . f

Minimal complete definition

Nothing

Methods

opoint :: Element mono -> mono Source

Lift an element into a monomorphic container.

opoint is the same as pure for an Applicative

Instances

MonoPointed ByteString Source 
MonoPointed ByteString Source 
MonoPointed IntSet Source 
MonoPointed Text Source 
MonoPointed Text Source 
MonoPointed [a] Source 
MonoPointed (IO a) Source 
MonoPointed (Identity a) Source 
MonoPointed (ZipList a) Source 
MonoPointed (Maybe a) Source 
MonoPointed (Set a) Source 
MonoPointed (Tree a) Source 
MonoPointed (Seq a) Source 
MonoPointed (ViewL a) Source 
MonoPointed (ViewR a) Source 
MonoPointed (DList a) Source 
MonoPointed (Option a) Source 
MonoPointed (NonEmpty a) Source 
Hashable a => MonoPointed (HashSet a) Source 
MonoPointed (Vector a) Source 
Unbox a => MonoPointed (Vector a) Source 
Storable a => MonoPointed (Vector a) Source 
MonoPointed (r -> a) Source 
MonoPointed (Either a b) Source 
Monoid a => MonoPointed (a, b) Source 
Monoid m => MonoPointed (Const m a) Source 
Monad m => MonoPointed (WrappedMonad m a) Source 
Applicative m => MonoPointed (IdentityT m a) Source 
Applicative m => MonoPointed (ListT m a) Source 
Applicative f => MonoPointed (WrappedApplicative f a) Source 
MonoPointed (MaybeApply f a) Source 
Applicative f => MonoPointed (MaybeT f a) Source 
MonoPointed mono => MonoPointed (MinLen (Succ Zero) mono) Source 
MonoPointed mono => MonoPointed (MinLen Zero mono) Source 
Arrow a => MonoPointed (WrappedArrow a b c) Source 
MonoPointed (Cokleisli w a b) Source 
MonoPointed (ContT r m a) Source 
Applicative m => MonoPointed (ReaderT r m a) Source 
Applicative m => MonoPointed (StateT s m a) Source 
Applicative m => MonoPointed (StateT s m a) Source 
Applicative m => MonoPointed (ErrorT e m a) Source 
(Monoid w, Applicative m) => MonoPointed (WriterT w m a) Source 
(Monoid w, Applicative m) => MonoPointed (WriterT w m a) Source 
(Applicative f, Applicative g) => MonoPointed (Compose f g a) Source 
Applicative f => MonoPointed (Static f a b) Source 
(Applicative f, Applicative g) => MonoPointed (Product f g a) Source 
(Monoid w, Applicative m) => MonoPointed (RWST r w s m a) Source 
(Monoid w, Applicative m) => MonoPointed (RWST r w s m a) Source 

class MonoFunctor mono => MonoComonad mono where Source

Typeclass for monomorphic containers where it is always okay to "extract" a value from with oextract, and where you can extrapolate any "extracting" function to be a function on the whole part with oextend.

oextend and oextract should work together following the laws:

oextend oextract      = id
oextract . oextend f  = f
oextend f . oextend g = oextend (f . oextend g)

As an intuition, oextend f uses f to "build up" a new mono with pieces from the old one received by f.

Minimal complete definition

Nothing

Methods

oextract :: mono -> Element mono Source

Extract an element from mono. Can be thought of as a dual concept to opoint.

oextend :: (mono -> Element mono) -> mono -> mono Source

Extend a mono -> Element mono function to be a mono -> mono; that is, builds a new mono from the old one by using pieces glimpsed from the given function.

Instances

MonoComonad (Identity a) Source 
MonoComonad (Tree a) Source 
MonoComonad (ViewL a) Source 
MonoComonad (ViewR a) Source 
MonoComonad (NonEmpty a) Source 
Monoid m => MonoComonad (m -> a) Source 
MonoComonad (e, a) Source 
Comonad w => MonoComonad (IdentityT w a) Source 
MonoComonad (Arg a b) Source 
IsSequence mono => MonoComonad (MinLen (Succ Zero) mono) Source

oextract is head.

For oextend f, the new mono is populated by applying f to successive tails of the original mono.

For example, for MinLen (Succ Zero) [Int], or NonNull [Int]:

oextend f [1,2,3,4,5] = [ f [1, 2, 3, 4, 5]
                          , f [2, 3, 4, 5]
                          , f [3, 4, 5]
                          , f [4, 5]
                          , f [5]
                          ]

Meant to be a direct analogy to the instance for NonEmpty a.

(Comonad w, Monoid m) => MonoComonad (TracedT m w a) Source 
Comonad w => MonoComonad (StoreT s w a) Source 
Comonad w => MonoComonad (EnvT e w a) Source