Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- data Quid
- newtype Size (n :: Nat) a = Size {
- unSize :: a
- newtype Decimal a = Decimal {
- unDecimal :: a
- newtype Hexadecimal a = Hexadecimal {
- unHexadecimal :: a
- newtype Latin a = Latin {
- unLatin :: a
The Quid type
Instances
Combinators
Instances
(Arbitrary a, KnownNat n) => Arbitrary (Size n a) | |
(KnownNat n, Data a) => Data (Size n a) | |
Defined in Internal.Test.QuickCheck.Quid.Combinators.Size gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Size n a -> c (Size n a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Size n a) # toConstr :: Size n a -> Constr # dataTypeOf :: Size n a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Size n a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Size n a)) # gmapT :: (forall b. Data b => b -> b) -> Size n a -> Size n a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Size n a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Size n a -> r # gmapQ :: (forall d. Data d => d -> u) -> Size n a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Size n a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Size n a -> m (Size n a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Size n a -> m (Size n a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Size n a -> m (Size n a) # | |
Generic (Size n a) | |
Read a => Read (Size n a) | |
Show a => Show (Size n a) | |
NFData a => NFData (Size n a) | |
Eq a => Eq (Size n a) | |
Ord a => Ord (Size n a) | |
Hashable a => Hashable (Size n a) | |
type Rep (Size n a) | |
Representations
Numerical representations
Instances
Function a => Function (Decimal a) | |
Data a => Data (Decimal a) | |
Defined in Internal.Test.QuickCheck.Quid.Representations.Decimal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Decimal a -> c (Decimal a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Decimal a) # toConstr :: Decimal a -> Constr # dataTypeOf :: Decimal a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Decimal a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Decimal a)) # gmapT :: (forall b. Data b => b -> b) -> Decimal a -> Decimal a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Decimal a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Decimal a -> r # gmapQ :: (forall d. Data d => d -> u) -> Decimal a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Decimal a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Decimal a -> m (Decimal a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Decimal a -> m (Decimal a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Decimal a -> m (Decimal a) # | |
Generic (Decimal a) | |
Num a => Num (Decimal a) | |
Read (Decimal Quid) | |
Show (Decimal Quid) | |
NFData a => NFData (Decimal a) | |
Eq a => Eq (Decimal a) | |
Ord a => Ord (Decimal a) | |
Hashable a => Hashable (Decimal a) | |
type Rep (Decimal a) | |
Defined in Internal.Test.QuickCheck.Quid.Representations.Decimal type Rep (Decimal a) = D1 ('MetaData "Decimal" "Internal.Test.QuickCheck.Quid.Representations.Decimal" "quickcheck-quid-0.0.1.6-9uHa034RpNq2KZtAs2YZax-internal" 'True) (C1 ('MetaCons "Decimal" 'PrefixI 'True) (S1 ('MetaSel ('Just "unDecimal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) |
newtype Hexadecimal a #
Hexadecimal | |
|
Instances
String representations
Instances
Function a => Function (Latin a) | |
Data a => Data (Latin a) | |
Defined in Internal.Test.QuickCheck.Quid.Representations.Latin 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) | |
Defined in Internal.Test.QuickCheck.Quid.Representations.Latin fromString :: String -> Latin Quid # | |
Generic (Latin a) | |
Read (Latin Quid) | |
Show (Latin Quid) | |
NFData a => NFData (Latin a) | |
Eq a => Eq (Latin a) | |
Ord a => Ord (Latin a) | |
Hashable a => Hashable (Latin a) | |
type Rep (Latin a) | |