recursion-schemes-5.1.2: Representing common recursion patterns as higher-order functions

Safe HaskellSafe
LanguageHaskell98

Data.Functor.Base

Description

Base Functors for standard types not already expressed as a fixed point.

Synopsis

Documentation

data NonEmptyF a b Source #

Base Functor for NonEmpty

Constructors

NonEmptyF 

Fields

Instances
Bitraversable NonEmptyF Source # 
Instance details

Defined in Data.Functor.Base

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> NonEmptyF a b -> f (NonEmptyF c d) #

Bifoldable NonEmptyF Source # 
Instance details

Defined in Data.Functor.Base

Methods

bifold :: Monoid m => NonEmptyF m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> NonEmptyF a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> NonEmptyF a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> NonEmptyF a b -> c #

Bifunctor NonEmptyF Source # 
Instance details

Defined in Data.Functor.Base

Methods

bimap :: (a -> b) -> (c -> d) -> NonEmptyF a c -> NonEmptyF b d #

first :: (a -> b) -> NonEmptyF a c -> NonEmptyF b c #

second :: (b -> c) -> NonEmptyF a b -> NonEmptyF a c #

Eq2 NonEmptyF Source # 
Instance details

Defined in Data.Functor.Base

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> NonEmptyF a c -> NonEmptyF b d -> Bool #

Ord2 NonEmptyF Source # 
Instance details

Defined in Data.Functor.Base

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> NonEmptyF a c -> NonEmptyF b d -> Ordering #

Read2 NonEmptyF Source # 
Instance details

Defined in Data.Functor.Base

Methods

liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (NonEmptyF a b) #

liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [NonEmptyF a b] #

liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (NonEmptyF a b) #

liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [NonEmptyF a b] #

Show2 NonEmptyF Source # 
Instance details

Defined in Data.Functor.Base

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> NonEmptyF a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [NonEmptyF a b] -> ShowS #

Functor (NonEmptyF a) Source # 
Instance details

Defined in Data.Functor.Base

Methods

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

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

Foldable (NonEmptyF a) Source # 
Instance details

Defined in Data.Functor.Base

Methods

fold :: Monoid m => NonEmptyF a m -> m #

foldMap :: Monoid m => (a0 -> m) -> NonEmptyF a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> NonEmptyF a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> NonEmptyF a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> NonEmptyF a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> NonEmptyF a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> NonEmptyF a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> NonEmptyF a a0 -> a0 #

toList :: NonEmptyF a a0 -> [a0] #

null :: NonEmptyF a a0 -> Bool #

length :: NonEmptyF a a0 -> Int #

elem :: Eq a0 => a0 -> NonEmptyF a a0 -> Bool #

maximum :: Ord a0 => NonEmptyF a a0 -> a0 #

minimum :: Ord a0 => NonEmptyF a a0 -> a0 #

sum :: Num a0 => NonEmptyF a a0 -> a0 #

product :: Num a0 => NonEmptyF a a0 -> a0 #

Traversable (NonEmptyF a) Source # 
Instance details

Defined in Data.Functor.Base

Methods

traverse :: Applicative f => (a0 -> f b) -> NonEmptyF a a0 -> f (NonEmptyF a b) #

sequenceA :: Applicative f => NonEmptyF a (f a0) -> f (NonEmptyF a a0) #

mapM :: Monad m => (a0 -> m b) -> NonEmptyF a a0 -> m (NonEmptyF a b) #

sequence :: Monad m => NonEmptyF a (m a0) -> m (NonEmptyF a a0) #

Eq a => Eq1 (NonEmptyF a) Source # 
Instance details

Defined in Data.Functor.Base

Methods

liftEq :: (a0 -> b -> Bool) -> NonEmptyF a a0 -> NonEmptyF a b -> Bool #

Ord a => Ord1 (NonEmptyF a) Source # 
Instance details

Defined in Data.Functor.Base

Methods

liftCompare :: (a0 -> b -> Ordering) -> NonEmptyF a a0 -> NonEmptyF a b -> Ordering #

Read a => Read1 (NonEmptyF a) Source # 
Instance details

Defined in Data.Functor.Base

Methods

liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (NonEmptyF a a0) #

liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [NonEmptyF a a0] #

liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (NonEmptyF a a0) #

liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [NonEmptyF a a0] #

Show a => Show1 (NonEmptyF a) Source # 
Instance details

Defined in Data.Functor.Base

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> NonEmptyF a a0 -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [NonEmptyF a a0] -> ShowS #

Generic1 (NonEmptyF a :: * -> *) Source # 
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep1 (NonEmptyF a) :: k -> * #

Methods

from1 :: NonEmptyF a a0 -> Rep1 (NonEmptyF a) a0 #

to1 :: Rep1 (NonEmptyF a) a0 -> NonEmptyF a a0 #

(Eq a, Eq b) => Eq (NonEmptyF a b) Source # 
Instance details

Defined in Data.Functor.Base

Methods

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

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

(Ord a, Ord b) => Ord (NonEmptyF a b) Source # 
Instance details

Defined in Data.Functor.Base

Methods

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

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

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

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

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

max :: NonEmptyF a b -> NonEmptyF a b -> NonEmptyF a b #

min :: NonEmptyF a b -> NonEmptyF a b -> NonEmptyF a b #

(Read a, Read b) => Read (NonEmptyF a b) Source # 
Instance details

Defined in Data.Functor.Base

(Show a, Show b) => Show (NonEmptyF a b) Source # 
Instance details

Defined in Data.Functor.Base

Methods

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

show :: NonEmptyF a b -> String #

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

Generic (NonEmptyF a b) Source # 
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep (NonEmptyF a b) :: * -> * #

Methods

from :: NonEmptyF a b -> Rep (NonEmptyF a b) x #

to :: Rep (NonEmptyF a b) x -> NonEmptyF a b #

type Rep1 (NonEmptyF a :: * -> *) Source # 
Instance details

Defined in Data.Functor.Base

type Rep1 (NonEmptyF a :: * -> *) = D1 (MetaData "NonEmptyF" "Data.Functor.Base" "recursion-schemes-5.1.2-inplace" False) (C1 (MetaCons "NonEmptyF" PrefixI True) (S1 (MetaSel (Just "head") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "tail") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Maybe)))
type Rep (NonEmptyF a b) Source # 
Instance details

Defined in Data.Functor.Base

type Rep (NonEmptyF a b) = D1 (MetaData "NonEmptyF" "Data.Functor.Base" "recursion-schemes-5.1.2-inplace" False) (C1 (MetaCons "NonEmptyF" PrefixI True) (S1 (MetaSel (Just "head") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "tail") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe b))))