prologue-3.2.3: Better, more general Prelude exporting common utilities.

Safe HaskellNone
LanguageHaskell2010

Prologue.Data.Foldable

Synopsis

Documentation

type family Foldables (lst :: [* -> *]) :: Constraint where ... Source #

Equations

Foldables '[] = () 
Foldables (t ': ts) = (Foldable t, Foldables ts) 

sequence_ :: (Foldable t, Applicative f) => t (f a) -> f () Source #

bisequence_ :: (Bifoldable t, Applicative f) => t (f a) (f b) -> f () Source #

traverse2_ :: (Applicative m, Foldables '[t1, t2]) => (a -> m b) -> t1 (t2 a) -> m () Source #

traverse3_ :: (Applicative m, Foldables '[t1, t2, t3]) => (a -> m b) -> t1 (t2 (t3 a)) -> m () Source #

traverse4_ :: (Applicative m, Foldables '[t1, t2, t3, t4]) => (a -> m b) -> t1 (t2 (t3 (t4 a))) -> m () Source #

traverse5_ :: (Applicative m, Foldables '[t1, t2, t3, t4, t5]) => (a -> m b) -> t1 (t2 (t3 (t4 (t5 a)))) -> m () Source #

unsafeMinimum :: Ord a => [a] -> a Source #

unsafeMaximum :: Ord a => [a] -> a Source #

minimum :: MonadPlus m => Ord a => [a] -> m a Source #

maximum :: MonadPlus m => Ord a => [a] -> m a Source #

minimumDef :: Ord a => a -> [a] -> a Source #

maximumDef :: Ord a => a -> [a] -> a Source #

mapM_ :: (Foldable t, Applicative f) => (a -> f b) -> t a -> f () Source #

bimapM_ :: (Bifoldable t, Applicative f) => (a -> f c) -> (b -> f d) -> t a b -> f () Source #

forM_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f () Source #

Deprecated: Use for_ instead