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

Internal.Test.QuickCheck.Quid.Representations.Latin

Documentation

newtype Latin a Source #

Constructors

Latin 

Fields

Instances

Instances details
Function a => Function (Latin a) Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Methods

function :: (Latin a -> b) -> Latin a :-> b #

Data a => Data (Latin a) Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Latin a -> c (Latin a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Latin a) #

toConstr :: Latin a -> Constr #

dataTypeOf :: Latin a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Latin a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Latin a)) #

gmapT :: (forall b. Data b => b -> b) -> Latin a -> Latin a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Latin a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Latin a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Latin a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Latin a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Latin a -> m (Latin a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Latin a -> m (Latin a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Latin a -> m (Latin a) #

IsString (Latin Quid) Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Generic (Latin a) Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Associated Types

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

Methods

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

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

Read (Latin Quid) Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Show (Latin Quid) Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

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

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Methods

rnf :: Latin a -> () #

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

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Methods

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

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

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

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Methods

compare :: Latin a -> Latin a -> Ordering #

(<) :: Latin a -> Latin a -> Bool #

(<=) :: Latin a -> Latin a -> Bool #

(>) :: Latin a -> Latin a -> Bool #

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

max :: Latin a -> Latin a -> Latin a #

min :: Latin a -> Latin a -> Latin a #

Hashable a => Hashable (Latin a) Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Methods

hashWithSalt :: Int -> Latin a -> Int #

hash :: Latin a -> Int #

type Rep (Latin a) Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

type Rep (Latin a) = D1 ('MetaData "Latin" "Internal.Test.QuickCheck.Quid.Representations.Latin" "quickcheck-quid-0.0.1.3-HF4t8PMmvVoExbFrFadO1K-internal" 'True) (C1 ('MetaCons "Latin" 'PrefixI 'True) (S1 ('MetaSel ('Just "unLatin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

data LatinChar Source #

Constructors

A 
B 
C 
D 
E 
F 
G 
H 
I 
J 
K 
L 
M 
N 
O 
P 
Q 
R 
S 
T 
U 
V 
W 
X 
Y 
Z 

Instances

Instances details
Arbitrary LatinChar Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Bounded LatinChar Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Enum LatinChar Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Read LatinChar Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Show LatinChar Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Eq LatinChar Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Ord LatinChar Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

newtype LatinString Source #

Instances

Instances details
Arbitrary LatinString Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

IsString LatinString Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Semigroup LatinString Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Read LatinString Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Show LatinString Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Eq LatinString Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin

Ord LatinString Source # 
Instance details

Defined in Internal.Test.QuickCheck.Quid.Representations.Latin