newtype-zoo-1.1.0.0: Newtype Wrapper Zoo

Safe HaskellNone
LanguageHaskell2010

NewtypeZoo.Consistent

Description

Indicate that something is Consistent.

Documentation

newtype Consistent a Source #

Constructors

Consistent a 
Instances
Monad Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

(>>=) :: Consistent a -> (a -> Consistent b) -> Consistent b #

(>>) :: Consistent a -> Consistent b -> Consistent b #

return :: a -> Consistent a #

fail :: String -> Consistent a #

Functor Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

fmap :: (a -> b) -> Consistent a -> Consistent b #

(<$) :: a -> Consistent b -> Consistent a #

MonadFix Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

mfix :: (a -> Consistent a) -> Consistent a #

Applicative Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

pure :: a -> Consistent a #

(<*>) :: Consistent (a -> b) -> Consistent a -> Consistent b #

liftA2 :: (a -> b -> c) -> Consistent a -> Consistent b -> Consistent c #

(*>) :: Consistent a -> Consistent b -> Consistent b #

(<*) :: Consistent a -> Consistent b -> Consistent a #

Foldable Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

fold :: Monoid m => Consistent m -> m #

foldMap :: Monoid m => (a -> m) -> Consistent a -> m #

foldr :: (a -> b -> b) -> b -> Consistent a -> b #

foldr' :: (a -> b -> b) -> b -> Consistent a -> b #

foldl :: (b -> a -> b) -> b -> Consistent a -> b #

foldl' :: (b -> a -> b) -> b -> Consistent a -> b #

foldr1 :: (a -> a -> a) -> Consistent a -> a #

foldl1 :: (a -> a -> a) -> Consistent a -> a #

toList :: Consistent a -> [a] #

null :: Consistent a -> Bool #

length :: Consistent a -> Int #

elem :: Eq a => a -> Consistent a -> Bool #

maximum :: Ord a => Consistent a -> a #

minimum :: Ord a => Consistent a -> a #

sum :: Num a => Consistent a -> a #

product :: Num a => Consistent a -> a #

Traversable Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

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

sequenceA :: Applicative f => Consistent (f a) -> f (Consistent a) #

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

sequence :: Monad m => Consistent (m a) -> m (Consistent a) #

Eq1 Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

liftEq :: (a -> b -> Bool) -> Consistent a -> Consistent b -> Bool #

Ord1 Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

liftCompare :: (a -> b -> Ordering) -> Consistent a -> Consistent b -> Ordering #

Read1 Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Show1 Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

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

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

MonadZip Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

mzip :: Consistent a -> Consistent b -> Consistent (a, b) #

mzipWith :: (a -> b -> c) -> Consistent a -> Consistent b -> Consistent c #

munzip :: Consistent (a, b) -> (Consistent a, Consistent b) #

Pointed Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

point :: a -> Consistent a #

Copointed Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

copoint :: Consistent a -> a #

Bounded a => Bounded (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Enum a => Enum (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Eq a => Eq (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

(==) :: Consistent a -> Consistent a -> Bool #

(/=) :: Consistent a -> Consistent a -> Bool #

Floating a => Floating (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Fractional a => Fractional (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Integral a => Integral (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Num a => Num (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Ord a => Ord (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Read a => Read (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Real a => Real (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

RealFloat a => RealFloat (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

RealFrac a => RealFrac (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

properFraction :: Integral b => Consistent a -> (b, Consistent a) #

truncate :: Integral b => Consistent a -> b #

round :: Integral b => Consistent a -> b #

ceiling :: Integral b => Consistent a -> b #

floor :: Integral b => Consistent a -> b #

Show a => Show (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Ix a => Ix (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

IsString a => IsString (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

fromString :: String -> Consistent a #

Generic (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Associated Types

type Rep (Consistent a) :: Type -> Type #

Methods

from :: Consistent a -> Rep (Consistent a) x #

to :: Rep (Consistent a) x -> Consistent a #

Semigroup a => Semigroup (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Monoid a => Monoid (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Arbitrary a => Arbitrary (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Bits a => Bits (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

FiniteBits a => FiniteBits (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Default a => Default (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

def :: Consistent a #

NFData a => NFData (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

rnf :: Consistent a -> () #

Random a => Random (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

Methods

randomR :: RandomGen g => (Consistent a, Consistent a) -> g -> (Consistent a, g) #

random :: RandomGen g => g -> (Consistent a, g) #

randomRs :: RandomGen g => (Consistent a, Consistent a) -> g -> [Consistent a] #

randoms :: RandomGen g => g -> [Consistent a] #

randomRIO :: (Consistent a, Consistent a) -> IO (Consistent a) #

randomIO :: IO (Consistent a) #

Generic1 Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

Associated Types

type Rep1 Consistent :: k -> Type #

type Rep (Consistent a) Source # 
Instance details

Defined in NewtypeZoo.Consistent

type Rep (Consistent a) = D1 (MetaData "Consistent" "NewtypeZoo.Consistent" "newtype-zoo-1.1.0.0-Ax7CodmSe5a620hcbx2lu9" True) (C1 (MetaCons "Consistent" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 Consistent Source # 
Instance details

Defined in NewtypeZoo.Consistent

type Rep1 Consistent = D1 (MetaData "Consistent" "NewtypeZoo.Consistent" "newtype-zoo-1.1.0.0-Ax7CodmSe5a620hcbx2lu9" True) (C1 (MetaCons "Consistent" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

theConsistent :: forall a b p f. (Profunctor p, Functor f) => p a (f b) -> p (Consistent a) (f (Consistent b)) Source #