quickcheck-quid-0.0.1.3: Quasi-unique identifiers for QuickCheck
Safe HaskellSafe-Inferred
LanguageHaskell2010

Test.QuickCheck.Quid.Example

Documentation

newtype FooId Source #

Constructors

FooId (Decimal Quid) 

Instances

Instances details
Arbitrary FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

arbitrary :: Gen FooId #

shrink :: FooId -> [FooId] #

CoArbitrary FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

coarbitrary :: FooId -> Gen b -> Gen b #

Function FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

function :: (FooId -> b) -> FooId :-> b #

Generic FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Associated Types

type Rep FooId :: Type -> Type #

Methods

from :: FooId -> Rep FooId x #

to :: Rep FooId x -> FooId #

Num FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Read FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Show FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

showsPrec :: Int -> FooId -> ShowS #

show :: FooId -> String #

showList :: [FooId] -> ShowS #

Eq FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

(==) :: FooId -> FooId -> Bool #

(/=) :: FooId -> FooId -> Bool #

Ord FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

compare :: FooId -> FooId -> Ordering #

(<) :: FooId -> FooId -> Bool #

(<=) :: FooId -> FooId -> Bool #

(>) :: FooId -> FooId -> Bool #

(>=) :: FooId -> FooId -> Bool #

max :: FooId -> FooId -> FooId #

min :: FooId -> FooId -> FooId #

type Rep FooId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

type Rep FooId = D1 ('MetaData "FooId" "Test.QuickCheck.Quid.Example" "quickcheck-quid-0.0.1.3-HF4t8PMmvVoExbFrFadO1K-example" 'True) (C1 ('MetaCons "FooId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Decimal Quid))))

newtype BarId Source #

Constructors

BarId (Hexadecimal Quid) 

Instances

Instances details
Arbitrary BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

arbitrary :: Gen BarId #

shrink :: BarId -> [BarId] #

CoArbitrary BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

coarbitrary :: BarId -> Gen b -> Gen b #

Function BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

function :: (BarId -> b) -> BarId :-> b #

Generic BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Associated Types

type Rep BarId :: Type -> Type #

Methods

from :: BarId -> Rep BarId x #

to :: Rep BarId x -> BarId #

Num BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Read BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Show BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

showsPrec :: Int -> BarId -> ShowS #

show :: BarId -> String #

showList :: [BarId] -> ShowS #

Eq BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

(==) :: BarId -> BarId -> Bool #

(/=) :: BarId -> BarId -> Bool #

Ord BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

compare :: BarId -> BarId -> Ordering #

(<) :: BarId -> BarId -> Bool #

(<=) :: BarId -> BarId -> Bool #

(>) :: BarId -> BarId -> Bool #

(>=) :: BarId -> BarId -> Bool #

max :: BarId -> BarId -> BarId #

min :: BarId -> BarId -> BarId #

type Rep BarId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

type Rep BarId = D1 ('MetaData "BarId" "Test.QuickCheck.Quid.Example" "quickcheck-quid-0.0.1.3-HF4t8PMmvVoExbFrFadO1K-example" 'True) (C1 ('MetaCons "BarId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Hexadecimal Quid))))

newtype BazId Source #

Constructors

BazId (Latin Quid) 

Instances

Instances details
Arbitrary BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

arbitrary :: Gen BazId #

shrink :: BazId -> [BazId] #

CoArbitrary BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

coarbitrary :: BazId -> Gen b -> Gen b #

Function BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

function :: (BazId -> b) -> BazId :-> b #

Generic BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Associated Types

type Rep BazId :: Type -> Type #

Methods

from :: BazId -> Rep BazId x #

to :: Rep BazId x -> BazId #

Read BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Show BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

showsPrec :: Int -> BazId -> ShowS #

show :: BazId -> String #

showList :: [BazId] -> ShowS #

Eq BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

(==) :: BazId -> BazId -> Bool #

(/=) :: BazId -> BazId -> Bool #

Ord BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

Methods

compare :: BazId -> BazId -> Ordering #

(<) :: BazId -> BazId -> Bool #

(<=) :: BazId -> BazId -> Bool #

(>) :: BazId -> BazId -> Bool #

(>=) :: BazId -> BazId -> Bool #

max :: BazId -> BazId -> BazId #

min :: BazId -> BazId -> BazId #

type Rep BazId Source # 
Instance details

Defined in Test.QuickCheck.Quid.Example

type Rep BazId = D1 ('MetaData "BazId" "Test.QuickCheck.Quid.Example" "quickcheck-quid-0.0.1.3-HF4t8PMmvVoExbFrFadO1K-example" 'True) (C1 ('MetaCons "BazId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Latin Quid))))