proton-0.0.4
Safe HaskellNone
LanguageHaskell2010

Data.Profunctor.Withering

Documentation

class Traversing p => Withering p where Source #

Methods

cull :: (forall f. Alternative f => (a -> f b) -> s -> f t) -> p a b -> p s t Source #

Instances

Instances details
Alternative f => Withering (Star f) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

cull :: (forall (f0 :: Type -> Type). Alternative f0 => (a -> f0 b) -> s -> f0 t) -> Star f a b -> Star f s t Source #

Monoid m => Withering (Forget m) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

cull :: (forall (f :: Type -> Type). Alternative f => (a -> f b) -> s -> f t) -> Forget m a b -> Forget m s t Source #

newtype AltConst a b Source #

Constructors

AltConst (Maybe a) 

Instances

Instances details
Functor (AltConst a) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

fmap :: (a0 -> b) -> AltConst a a0 -> AltConst a b #

(<$) :: a0 -> AltConst a b -> AltConst a a0 #

Monoid a => Applicative (AltConst a) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

pure :: a0 -> AltConst a a0 #

(<*>) :: AltConst a (a0 -> b) -> AltConst a a0 -> AltConst a b #

liftA2 :: (a0 -> b -> c) -> AltConst a a0 -> AltConst a b -> AltConst a c #

(*>) :: AltConst a a0 -> AltConst a b -> AltConst a b #

(<*) :: AltConst a a0 -> AltConst a b -> AltConst a a0 #

Monoid m => Alternative (AltConst m) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

empty :: AltConst m a #

(<|>) :: AltConst m a -> AltConst m a -> AltConst m a #

some :: AltConst m a -> AltConst m [a] #

many :: AltConst m a -> AltConst m [a] #

Eq a => Eq (AltConst a b) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

(==) :: AltConst a b -> AltConst a b -> Bool #

(/=) :: AltConst a b -> AltConst a b -> Bool #

Ord a => Ord (AltConst a b) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

compare :: AltConst a b -> AltConst a b -> Ordering #

(<) :: AltConst a b -> AltConst a b -> Bool #

(<=) :: AltConst a b -> AltConst a b -> Bool #

(>) :: AltConst a b -> AltConst a b -> Bool #

(>=) :: AltConst a b -> AltConst a b -> Bool #

max :: AltConst a b -> AltConst a b -> AltConst a b #

min :: AltConst a b -> AltConst a b -> AltConst a b #

Show a => Show (AltConst a b) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

showsPrec :: Int -> AltConst a b -> ShowS #

show :: AltConst a b -> String #

showList :: [AltConst a b] -> ShowS #

Semigroup a => Semigroup (AltConst a x) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

(<>) :: AltConst a x -> AltConst a x -> AltConst a x #

sconcat :: NonEmpty (AltConst a x) -> AltConst a x #

stimes :: Integral b => b -> AltConst a x -> AltConst a x #

Monoid a => Monoid (AltConst a x) Source # 
Instance details

Defined in Data.Profunctor.Withering

Methods

mempty :: AltConst a x #

mappend :: AltConst a x -> AltConst a x -> AltConst a x #

mconcat :: [AltConst a x] -> AltConst a x #