quickcheck-monoid-subclasses-0.3.0.6: Testing monoid subclass instances with QuickCheck
Copyright© 2022–2025 Jonathan Knowles
LicenseApache-2.0
Safe HaskellNone
LanguageHaskell2010

Internal.Prelude

Description

 

Documentation

allNonNull :: (Eq a, Semigroup a, Foldable f) => f a -> Bool #

allUnique :: (Eq a, Foldable f) => f a -> Bool #

allUniqueNonNull :: (Eq a, Foldable f, Semigroup a) => f a -> Bool #

data Variable #

Constructors

A 
B 
C 
D 

data Tuple2 s #

Instances

Instances details
Arbitrary a => Arbitrary (Tuple2 a) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

arbitrary :: Gen (Tuple2 a) #

shrink :: Tuple2 a -> [Tuple2 a] #

(Show s, Semigroup s) => Show (Tuple2 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

showsPrec :: Int -> Tuple2 s -> ShowS #

show :: Tuple2 s -> String #

showList :: [Tuple2 s] -> ShowS #

Eq s => Eq (Tuple2 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

(==) :: Tuple2 s -> Tuple2 s -> Bool #

(/=) :: Tuple2 s -> Tuple2 s -> Bool #

Ord s => Ord (Tuple2 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

compare :: Tuple2 s -> Tuple2 s -> Ordering #

(<) :: Tuple2 s -> Tuple2 s -> Bool #

(<=) :: Tuple2 s -> Tuple2 s -> Bool #

(>) :: Tuple2 s -> Tuple2 s -> Bool #

(>=) :: Tuple2 s -> Tuple2 s -> Bool #

max :: Tuple2 s -> Tuple2 s -> Tuple2 s #

min :: Tuple2 s -> Tuple2 s -> Tuple2 s #

data Tuple3 s #

Instances

Instances details
Arbitrary a => Arbitrary (Tuple3 a) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

arbitrary :: Gen (Tuple3 a) #

shrink :: Tuple3 a -> [Tuple3 a] #

(Show s, Semigroup s) => Show (Tuple3 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

showsPrec :: Int -> Tuple3 s -> ShowS #

show :: Tuple3 s -> String #

showList :: [Tuple3 s] -> ShowS #

Eq s => Eq (Tuple3 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

(==) :: Tuple3 s -> Tuple3 s -> Bool #

(/=) :: Tuple3 s -> Tuple3 s -> Bool #

Ord s => Ord (Tuple3 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

compare :: Tuple3 s -> Tuple3 s -> Ordering #

(<) :: Tuple3 s -> Tuple3 s -> Bool #

(<=) :: Tuple3 s -> Tuple3 s -> Bool #

(>) :: Tuple3 s -> Tuple3 s -> Bool #

(>=) :: Tuple3 s -> Tuple3 s -> Bool #

max :: Tuple3 s -> Tuple3 s -> Tuple3 s #

min :: Tuple3 s -> Tuple3 s -> Tuple3 s #

data Tuple1 s #

Constructors

Tuple1 VariableSum (BindingSet s) 

Instances

Instances details
Arbitrary a => Arbitrary (Tuple1 a) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

arbitrary :: Gen (Tuple1 a) #

shrink :: Tuple1 a -> [Tuple1 a] #

(Show s, Semigroup s) => Show (Tuple1 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

showsPrec :: Int -> Tuple1 s -> ShowS #

show :: Tuple1 s -> String #

showList :: [Tuple1 s] -> ShowS #

Eq s => Eq (Tuple1 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

(==) :: Tuple1 s -> Tuple1 s -> Bool #

(/=) :: Tuple1 s -> Tuple1 s -> Bool #

Ord s => Ord (Tuple1 s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

compare :: Tuple1 s -> Tuple1 s -> Ordering #

(<) :: Tuple1 s -> Tuple1 s -> Bool #

(<=) :: Tuple1 s -> Tuple1 s -> Bool #

(>) :: Tuple1 s -> Tuple1 s -> Bool #

(>=) :: Tuple1 s -> Tuple1 s -> Bool #

max :: Tuple1 s -> Tuple1 s -> Tuple1 s #

min :: Tuple1 s -> Tuple1 s -> Tuple1 s #

data BindingSet s #

Constructors

BindingSet 

Fields

Instances

Instances details
Arbitrary s => Arbitrary (BindingSet s) 
Instance details

Defined in Internal.Semigroup.Tuple

Generic (BindingSet s) 
Instance details

Defined in Internal.Semigroup.Tuple

Associated Types

type Rep (BindingSet s) 
Instance details

Defined in Internal.Semigroup.Tuple

type Rep (BindingSet s) = D1 ('MetaData "BindingSet" "Internal.Semigroup.Tuple" "quickcheck-monoid-subclasses-0.3.0.6-Dlr2j5dDxrH4nrS4BOK0Ld-internal" 'False) (C1 ('MetaCons "BindingSet" 'PrefixI 'True) ((S1 ('MetaSel ('Just "bindingForA") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 s) :*: S1 ('MetaSel ('Just "bindingForB") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 s)) :*: (S1 ('MetaSel ('Just "bindingForC") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 s) :*: S1 ('MetaSel ('Just "bindingForD") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 s))))

Methods

from :: BindingSet s -> Rep (BindingSet s) x #

to :: Rep (BindingSet s) x -> BindingSet s #

Show s => Show (BindingSet s) 
Instance details

Defined in Internal.Semigroup.Tuple

Eq s => Eq (BindingSet s) 
Instance details

Defined in Internal.Semigroup.Tuple

Methods

(==) :: BindingSet s -> BindingSet s -> Bool #

(/=) :: BindingSet s -> BindingSet s -> Bool #

Ord s => Ord (BindingSet s) 
Instance details

Defined in Internal.Semigroup.Tuple

type Rep (BindingSet s) 
Instance details

Defined in Internal.Semigroup.Tuple

type Rep (BindingSet s) = D1 ('MetaData "BindingSet" "Internal.Semigroup.Tuple" "quickcheck-monoid-subclasses-0.3.0.6-Dlr2j5dDxrH4nrS4BOK0Ld-internal" 'False) (C1 ('MetaCons "BindingSet" 'PrefixI 'True) ((S1 ('MetaSel ('Just "bindingForA") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 s) :*: S1 ('MetaSel ('Just "bindingForB") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 s)) :*: (S1 ('MetaSel ('Just "bindingForC") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 s) :*: S1 ('MetaSel ('Just "bindingForD") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 s))))

evalTuple1 :: Semigroup s => Tuple1 s -> s #

evalTuple2 :: Semigroup s => Tuple2 s -> (s, s) #

evalTuple3 :: Semigroup s => Tuple3 s -> (s, s, s) #

showWrap :: Show a => a -> String #

universe :: (Bounded a, Enum a) => [a] #