mono-traversable-instances-0.1.1.0: Extra typeclass instances for mono-traversable
Data.MonoTraversable.Instances
Contents
Associated Types
type Index (DList a) :: Type #
Methods
intersperse :: Element (DList a) -> DList a -> DList a #
reverse :: DList a -> DList a #
find :: (Element (DList a) -> Bool) -> DList a -> Maybe (Element (DList a)) #
sortBy :: (Element (DList a) -> Element (DList a) -> Ordering) -> DList a -> DList a #
cons :: Element (DList a) -> DList a -> DList a #
snoc :: DList a -> Element (DList a) -> DList a #
fromList :: [Element (DList a)] -> DList a #
lengthIndex :: DList a -> Index (DList a) #
break :: (Element (DList a) -> Bool) -> DList a -> (DList a, DList a) #
span :: (Element (DList a) -> Bool) -> DList a -> (DList a, DList a) #
dropWhile :: (Element (DList a) -> Bool) -> DList a -> DList a #
takeWhile :: (Element (DList a) -> Bool) -> DList a -> DList a #
splitAt :: Index (DList a) -> DList a -> (DList a, DList a) #
unsafeSplitAt :: Index (DList a) -> DList a -> (DList a, DList a) #
take :: Index (DList a) -> DList a -> DList a #
unsafeTake :: Index (DList a) -> DList a -> DList a #
drop :: Index (DList a) -> DList a -> DList a #
unsafeDrop :: Index (DList a) -> DList a -> DList a #
dropEnd :: Index (DList a) -> DList a -> DList a #
partition :: (Element (DList a) -> Bool) -> DList a -> (DList a, DList a) #
uncons :: DList a -> Maybe (Element (DList a), DList a) #
unsnoc :: DList a -> Maybe (DList a, Element (DList a)) #
filter :: (Element (DList a) -> Bool) -> DList a -> DList a #
filterM :: Monad m => (Element (DList a) -> m Bool) -> DList a -> m (DList a) #
replicate :: Index (DList a) -> Element (DList a) -> DList a #
replicateM :: Monad m => Index (DList a) -> m (Element (DList a)) -> m (DList a) #
groupBy :: (Element (DList a) -> Element (DList a) -> Bool) -> DList a -> [DList a] #
groupAllOn :: Eq b => (Element (DList a) -> b) -> DList a -> [DList a] #
subsequences :: DList a -> [DList a] #
permutations :: DList a -> [DList a] #
tailEx :: DList a -> DList a #
tailMay :: DList a -> Maybe (DList a) #
initEx :: DList a -> DList a #
initMay :: DList a -> Maybe (DList a) #
unsafeTail :: DList a -> DList a #
unsafeInit :: DList a -> DList a #
index :: DList a -> Index (DList a) -> Maybe (Element (DList a)) #
indexEx :: DList a -> Index (DList a) -> Element (DList a) #
unsafeIndex :: DList a -> Index (DList a) -> Element (DList a) #
splitWhen :: (Element (DList a) -> Bool) -> DList a -> [DList a] #
omap :: (Element (DList a) -> Element (DList a)) -> DList a -> DList a #
ofoldMap :: Monoid m => (Element (DList a) -> m) -> DList a -> m #
ofoldr :: (Element (DList a) -> b -> b) -> b -> DList a -> b #
ofoldl' :: (a0 -> Element (DList a) -> a0) -> a0 -> DList a -> a0 #
otoList :: DList a -> [Element (DList a)] #
oall :: (Element (DList a) -> Bool) -> DList a -> Bool #
oany :: (Element (DList a) -> Bool) -> DList a -> Bool #
onull :: DList a -> Bool #
olength :: DList a -> Int #
olength64 :: DList a -> Int64 #
ocompareLength :: Integral i => DList a -> i -> Ordering #
otraverse_ :: Applicative f => (Element (DList a) -> f b) -> DList a -> f () #
ofor_ :: Applicative f => DList a -> (Element (DList a) -> f b) -> f () #
omapM_ :: Applicative m => (Element (DList a) -> m ()) -> DList a -> m () #
oforM_ :: Applicative m => DList a -> (Element (DList a) -> m ()) -> m () #
ofoldlM :: Monad m => (a0 -> Element (DList a) -> m a0) -> a0 -> DList a -> m a0 #
ofoldMap1Ex :: Semigroup m => (Element (DList a) -> m) -> DList a -> m #
ofoldr1Ex :: (Element (DList a) -> Element (DList a) -> Element (DList a)) -> DList a -> Element (DList a) #
ofoldl1Ex' :: (Element (DList a) -> Element (DList a) -> Element (DList a)) -> DList a -> Element (DList a) #
headEx :: DList a -> Element (DList a) #
lastEx :: DList a -> Element (DList a) #
unsafeHead :: DList a -> Element (DList a) #
unsafeLast :: DList a -> Element (DList a) #
maximumByEx :: (Element (DList a) -> Element (DList a) -> Ordering) -> DList a -> Element (DList a) #
minimumByEx :: (Element (DList a) -> Element (DList a) -> Ordering) -> DList a -> Element (DList a) #
oelem :: Element (DList a) -> DList a -> Bool #
onotElem :: Element (DList a) -> DList a -> Bool #
otraverse :: Applicative f => (Element (DList a) -> f (Element (DList a))) -> DList a -> f (DList a) #
omapM :: Applicative m => (Element (DList a) -> m (Element (DList a))) -> DList a -> m (DList a) #
opoint :: Element (DList a) -> DList a #
oextract :: Identity a -> Element (Identity a) #
oextend :: (Identity a -> Element (Identity a)) -> Identity a -> Identity a #
oextract :: NonEmpty a -> Element (NonEmpty a) #
oextend :: (NonEmpty a -> Element (NonEmpty a)) -> NonEmpty a -> NonEmpty a #
oextract :: Tree a -> Element (Tree a) #
oextend :: (Tree a -> Element (Tree a)) -> Tree a -> Tree a #
omap :: (Element (WrappedApplicative f a) -> Element (WrappedApplicative f a)) -> WrappedApplicative f a -> WrappedApplicative f a #
omap :: (Element (MaybeApply f a) -> Element (MaybeApply f a)) -> MaybeApply f a -> MaybeApply f a #
opoint :: Element (WrappedApplicative f a) -> WrappedApplicative f a #
opoint :: Element (MaybeApply f a) -> MaybeApply f a #
oextract :: (m -> a) -> Element (m -> a) #
oextend :: ((m -> a) -> Element (m -> a)) -> (m -> a) -> m -> a #
oextract :: (e, a) -> Element (e, a) #
oextend :: ((e, a) -> Element (e, a)) -> (e, a) -> (e, a) #
oextract :: Arg a b -> Element (Arg a b) #
oextend :: (Arg a b -> Element (Arg a b)) -> Arg a b -> Arg a b #
omap :: (Element (TracedT m w a) -> Element (TracedT m w a)) -> TracedT m w a -> TracedT m w a #
omap :: (Element (StoreT s w a) -> Element (StoreT s w a)) -> StoreT s w a -> StoreT s w a #
omap :: (Element (EnvT e w a) -> Element (EnvT e w a)) -> EnvT e w a -> EnvT e w a #
omap :: (Element (Static f a b) -> Element (Static f a b)) -> Static f a b -> Static f a b #
opoint :: Element (Static f a b) -> Static f a b #
oextract :: TracedT m w a -> Element (TracedT m w a) #
oextend :: (TracedT m w a -> Element (TracedT m w a)) -> TracedT m w a -> TracedT m w a #
oextract :: StoreT s w a -> Element (StoreT s w a) #
oextend :: (StoreT s w a -> Element (StoreT s w a)) -> StoreT s w a -> StoreT s w a #
oextract :: EnvT e w a -> Element (EnvT e w a) #
oextend :: (EnvT e w a -> Element (EnvT e w a)) -> EnvT e w a -> EnvT e w a #
oextract :: IdentityT w a -> Element (IdentityT w a) #
oextend :: (IdentityT w a -> Element (IdentityT w a)) -> IdentityT w a -> IdentityT w a #
omap :: (Element (Cokleisli w a b) -> Element (Cokleisli w a b)) -> Cokleisli w a b -> Cokleisli w a b #
opoint :: Element (Cokleisli w a b) -> Cokleisli w a b #