cardano-ledger-core-1.19.0.0: Core components of Cardano ledgers from the Shelley release on.
Safe HaskellNone
LanguageHaskell2010

Test.Cardano.Ledger.Common

Synopsis

Documentation

module Test.Hspec

vectorArbitrary a ⇒ IntGen [a] Source #

Generates a list of a given length.

voidFunctor f ⇒ f a → f () #

void value discards or ignores the result of evaluation, such as the return value of an IO action.

Examples

Expand

Replace the contents of a Maybe Int with unit:

>>> void Nothing
Nothing
>>> void (Just 3)
Just ()

Replace the contents of an Either Int Int with unit, resulting in an Either Int ():

>>> void (Left 8675309)
Left 8675309
>>> void (Right 8675309)
Right ()

Replace every element of a list with unit:

>>> void [1,2,3]
[(),(),()]

Replace the second element of a pair with unit:

>>> void (1,2)
(1,())

Discard the result of an IO action:

>>> mapM print [1,2]
1
2
[(),()]
>>> void $ mapM print [1,2]
1
2

newtype NonEmptyList a Source #

NonEmpty xs: guarantees that xs is non-empty.

Constructors

NonEmpty 

Fields

Instances

Instances details
Functor NonEmptyList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → NonEmptyList a → NonEmptyList b #

(<$) ∷ a → NonEmptyList b → NonEmptyList a #

Arbitrary a ⇒ Arbitrary (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a ⇒ Read (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntNonEmptyList a → ShowS #

showNonEmptyList a → String #

showList ∷ [NonEmptyList a] → ShowS #

Eq a ⇒ Eq (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)NonEmptyList a → NonEmptyList a → Bool #

(/=)NonEmptyList a → NonEmptyList a → Bool #

Ord a ⇒ Ord (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(==>)Testable prop ⇒ Bool → prop → Property infixr 0 Source #

Implication for properties: The resulting property holds if the first argument is False (in which case the test case is discarded), or if the given property holds. Note that using implication carelessly can severely skew test case distribution: consider using cover to make sure that your test data is still good quality.

data Result Source #

Result represents the test result

Constructors

Success

A successful test run

Fields

GaveUp

Given up

Fields

Failure

A failed test run

Fields

NoExpectedFailure

A property that should have failed did not

Fields

Instances

Instances details
Show Result 
Instance details

Defined in Test.QuickCheck.Test

Methods

showsPrecIntResultShowS #

showResultString #

showList ∷ [Result] → ShowS #

class Testable prop where Source #

The class of properties, i.e., types which QuickCheck knows how to test. Typically a property will be a function returning Bool or Property.

Minimal complete definition

property

Methods

property ∷ prop → Property Source #

Convert the thing to a property.

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → prop) → Property Source #

Optional; used internally in order to improve shrinking. Tests a property but also quantifies over an extra value (with a custom shrink and show function). The Testable instance for functions defines propertyForAllShrinkShow in a way that improves shrinking.

Instances

Instances details
Testable Assertion 
Instance details

Defined in Test.QuickCheck.IO

Methods

propertyAssertionProperty Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Assertion) → Property Source #

Testable Discard 
Instance details

Defined in Test.QuickCheck.Property

Methods

propertyDiscardProperty Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Discard) → Property Source #

Testable Prop 
Instance details

Defined in Test.QuickCheck.Property

Methods

property ∷ Prop → Property Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Prop) → Property Source #

Testable Property 
Instance details

Defined in Test.QuickCheck.Property

Methods

propertyPropertyProperty Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Property) → Property Source #

Testable Result 
Instance details

Defined in Test.QuickCheck.Property

Methods

property ∷ Result → Property Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Result) → Property Source #

Testable () 
Instance details

Defined in Test.QuickCheck.Property

Methods

property ∷ () → Property Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → ()) → Property Source #

Testable Bool 
Instance details

Defined in Test.QuickCheck.Property

Methods

propertyBoolProperty Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Bool) → Property Source #

Testable prop ⇒ Testable (Gen prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

propertyGen prop → Property Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Gen prop) → Property Source #

Testable prop ⇒ Testable (Maybe prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

propertyMaybe prop → Property Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Maybe prop) → Property Source #

(ImpSpec t, Testable a) ⇒ Testable (ImpM t a) 
Instance details

Defined in Test.ImpSpec.Internal

Methods

propertyImpM t a → Property Source #

propertyForAllShrinkShowGen a0 → (a0 → [a0]) → (a0 → [String]) → (a0 → ImpM t a) → Property Source #

(Arbitrary a, Show a, Testable prop) ⇒ Testable (a → prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

property ∷ (a → prop) → Property Source #

propertyForAllShrinkShowGen a0 → (a0 → [a0]) → (a0 → [String]) → (a0 → a → prop) → Property Source #

class Arbitrary a where Source #

Random generation and shrinking of values.

QuickCheck provides Arbitrary instances for most types in base, except those which incur extra dependencies. For a wider range of Arbitrary instances see the quickcheck-instances package.

Minimal complete definition

arbitrary

Methods

arbitraryGen a Source #

A generator for values of the given type.

It is worth spending time thinking about what sort of test data you want - good generators are often the difference between finding bugs and not finding them. You can use sample, label and classify to check the quality of your test data.

There is no generic arbitrary implementation included because we don't know how to make a high-quality one. If you want one, consider using the testing-feat or generic-random packages.

The QuickCheck manual goes into detail on how to write good generators. Make sure to look at it, especially if your type is recursive!

shrink ∷ a → [a] Source #

Produces a (possibly) empty list of all the possible immediate shrinks of the given value.

The default implementation returns the empty list, so will not try to shrink the value. If your data type has no special invariants, you can enable shrinking by defining shrink = genericShrink, but by customising the behaviour of shrink you can often get simpler counterexamples.

Most implementations of shrink should try at least three things:

  1. Shrink a term to any of its immediate subterms. You can use subterms to do this.
  2. Recursively apply shrink to all immediate subterms. You can use recursivelyShrink to do this.
  3. Type-specific shrinkings such as replacing a constructor by a simpler constructor.

For example, suppose we have the following implementation of binary trees:

data Tree a = Nil | Branch a (Tree a) (Tree a)

We can then define shrink as follows:

shrink Nil = []
shrink (Branch x l r) =
  -- shrink Branch to Nil
  [Nil] ++
  -- shrink to subterms
  [l, r] ++
  -- recursively shrink subterms
  [Branch x' l' r' | (x', l', r') <- shrink (x, l, r)]

There are a couple of subtleties here:

  • QuickCheck tries the shrinking candidates in the order they appear in the list, so we put more aggressive shrinking steps (such as replacing the whole tree by Nil) before smaller ones (such as recursively shrinking the subtrees).
  • It is tempting to write the last line as [Branch x' l' r' | x' <- shrink x, l' <- shrink l, r' <- shrink r] but this is the wrong thing! It will force QuickCheck to shrink x, l and r in tandem, and shrinking will stop once one of the three is fully shrunk.

There is a fair bit of boilerplate in the code above. We can avoid it with the help of some generic functions. The function genericShrink tries shrinking a term to all of its subterms and, failing that, recursively shrinks the subterms. Using it, we can define shrink as:

shrink x = shrinkToNil x ++ genericShrink x
  where
    shrinkToNil Nil = []
    shrinkToNil (Branch _ l r) = [Nil]

genericShrink is a combination of subterms, which shrinks a term to any of its subterms, and recursivelyShrink, which shrinks all subterms of a term. These may be useful if you need a bit more control over shrinking than genericShrink gives you.

A final gotcha: we cannot define shrink as simply shrink x = Nil:genericShrink x as this shrinks Nil to Nil, and shrinking will go into an infinite loop.

If all this leaves you bewildered, you might try shrink = genericShrink to begin with, after deriving Generic for your type. However, if your data type has any special invariants, you will need to check that genericShrink can't break those invariants.

Instances

Instances details
Arbitrary ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary A 
Instance details

Defined in Test.QuickCheck.Poly

Methods

arbitraryGen A Source #

shrinkA → [A] Source #

Arbitrary B 
Instance details

Defined in Test.QuickCheck.Poly

Methods

arbitraryGen B Source #

shrinkB → [B] Source #

Arbitrary C 
Instance details

Defined in Test.QuickCheck.Poly

Methods

arbitraryGen C Source #

shrinkC → [C] Source #

Arbitrary OrdA 
Instance details

Defined in Test.QuickCheck.Poly

Arbitrary OrdB 
Instance details

Defined in Test.QuickCheck.Poly

Arbitrary OrdC 
Instance details

Defined in Test.QuickCheck.Poly

Arbitrary QCGen 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen QCGen Source #

shrink ∷ QCGen → [QCGen] Source #

Arbitrary Key

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.Key

Methods

arbitraryGen Key Source #

shrinkKey → [Key] Source #

Arbitrary Value

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.Types.Internal

Arbitrary ByteArray

Since: quickcheck-instances-0.3.28

Instance details

Defined in Test.QuickCheck.Instances.Primitive

Arbitrary ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Arbitrary ByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Arbitrary ByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Arbitrary ShortByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Arbitrary Version 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary U 
Instance details

Defined in Test.Cardano.Ledger.Binary.Vintage.Helpers

Methods

arbitraryGen U Source #

shrinkU → [U] Source #

Arbitrary AddrAttributes Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Address Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Addr Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary BootstrapAddress Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary CompactAddr Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary RewardAccount Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Withdrawals Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ActiveSlotCoeff Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Anchor Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary BlocksMade Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary CertIx Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary DnsName Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Network Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary NonNegativeInterval Source #

Decimal numbers only

Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Nonce Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Port Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary PositiveInterval Source #

Decimal numbers only

Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary PositiveUnitInterval Source #

Decimal numbers only

Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ProtVer Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary TxIx Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary UnitInterval Source #

Decimal numbers only

Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Url Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen Url Source #

shrinkUrl → [Url] Source #

Arbitrary Coin Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary DeltaCoin Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary PoolCert Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Ptr Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen Ptr Source #

shrinkPtr → [Ptr] Source #

Arbitrary SlotNo32 Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary StakeReference Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary DRep Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary DRepState Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary GenDelegPair Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary GenDelegs Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ScriptHash Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary TxAuxDataHash Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary BootstrapWitness Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ChainCode Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary CostModel Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary CostModels Source #

This Arbitrary instance assumes the inflexible deserialization scheme prior to version 9.

Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ExUnits Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Prices Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Language Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Reward Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary RewardType Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary CommitteeAuthorization Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary FutureGenDeleg Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary InstantaneousRewards Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ChainAccountState Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary IndividualPoolStake Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary PoolDistr Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary SnapShot Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary SnapShots Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary Stake Source #

In the system, Stake never contains more than the sum of all Ada (which is constant). This makes it safe to store individual Coins (in CompactForm) as Word64. But we must be careful that we never generate Stake where the sum of all the coins exceeds (maxBound :: Word64) There will never be a real Stake in the system with that many Ada, because total Ada is constant. So using a restricted Arbitrary Generator is OK.

Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary PoolMetadata Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary SizeOfPoolOwners Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary SizeOfPoolRelays Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary StakePoolParams Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary StakePoolRelay Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary StakePoolState Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary TxId Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary TxIn Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ByronKeyPair Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.KeyPair

Arbitrary BlockNo 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary EpochInterval Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary EpochNo 
Instance details

Defined in Test.Cardano.Slotting.Arbitrary

Arbitrary EpochSize 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary SlotNo 
Instance details

Defined in Test.Cardano.Slotting.Arbitrary

Arbitrary SystemStart 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary ByteArray 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary SlicedByteArray 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary Term 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary IntSet

WARNING: The same warning as for Arbitrary (Set a) applies here.

Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary All 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen All Source #

shrinkAll → [All] Source #

Arbitrary Any 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen Any Source #

shrinkAny → [Any] Source #

Arbitrary Version

Generates Version with non-empty non-negative versionBranch, and empty versionTags

Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CChar 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CClock 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CDouble 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CFloat 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CInt 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CIntMax 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CIntPtr 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CLLong 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CLong 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CPtrdiff 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CSChar 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CSUSeconds 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CShort 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CSigAtomic 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CSize 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CTime 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CUChar 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CUInt 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CUIntMax 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CUIntPtr 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CULLong 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CULong 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CUSeconds 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CUShort 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary CWchar 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary ExitCode 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Newline 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary NewlineMode 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Int16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Int32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Int64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Int8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Word16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Word32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Word64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Word8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Ordering 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary IPv4 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary IPv6 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary CalendarTime 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Arbitrary ClockTime 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Arbitrary Day 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Methods

arbitraryGen Day Source #

shrinkDay → [Day] Source #

Arbitrary Month 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Arbitrary TimeDiff 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Arbitrary Data Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ExBudget Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ExCPU Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary ExMemory Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary FaceValue 
Instance details

Defined in PlutusLedgerApi.Test.V1.Data.Value

Arbitrary FaceValue 
Instance details

Defined in PlutusLedgerApi.Test.V1.Value

Arbitrary Quantity 
Instance details

Defined in PlutusLedgerApi.Test.V3.Data.MintValue

Arbitrary Quantity 
Instance details

Defined in PlutusLedgerApi.Test.V3.MintValue

Arbitrary Scientific 
Instance details

Defined in Test.QuickCheck.Instances.Scientific

Arbitrary Text 
Instance details

Defined in Test.QuickCheck.Instances.Text

Arbitrary Text 
Instance details

Defined in Test.QuickCheck.Instances.Text

Arbitrary ShortText 
Instance details

Defined in Test.QuickCheck.Instances.Text.Short

Arbitrary CalendarDiffDays 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary Day 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

arbitraryGen Day Source #

shrinkDay → [Day] Source #

Arbitrary Month 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary Quarter 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary QuarterOfYear 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary DayOfWeek 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary AbsoluteTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary DiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary NominalDiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary SystemTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary UTCTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary UniversalTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary CalendarDiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary LocalTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary TimeOfDay 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary TimeZone 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary ZonedTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Arbitrary Expr 
Instance details

Defined in Data.TreeDiff.Expr

Arbitrary UUID

Uniform distribution.

Instance details

Defined in Test.QuickCheck.Instances.UUID

Arbitrary Integer 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Natural 
Instance details

Defined in Test.QuickCheck.Instances.Natural

Arbitrary () 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen () Source #

shrink ∷ () → [()] Source #

Arbitrary Bool 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Char 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Double 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Float 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary Int 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen Int Source #

shrinkInt → [Int] Source #

Arbitrary Word 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary a ⇒ Arbitrary (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Blind a) Source #

shrinkBlind a → [Blind a] Source #

Arbitrary a ⇒ Arbitrary (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Fixed a) Source #

shrinkFixed a → [Fixed a] Source #

Arbitrary a ⇒ Arbitrary (InfiniteList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary a ⇒ Arbitrary (InfiniteListInternalData a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (InfiniteListInternalData a) Source #

shrink ∷ InfiniteListInternalData a → [InfiniteListInternalData a] Source #

(Integral a, Bounded a) ⇒ Arbitrary (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Large a) Source #

shrinkLarge a → [Large a] Source #

(Num a, Ord a, Arbitrary a) ⇒ Arbitrary (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary a ⇒ Arbitrary (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(Num a, Ord a, Arbitrary a) ⇒ Arbitrary (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(Num a, Ord a, Arbitrary a) ⇒ Arbitrary (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(Num a, Eq a, Arbitrary a) ⇒ Arbitrary (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (NonZero a) Source #

shrinkNonZero a → [NonZero a] Source #

(Ord a, Arbitrary a) ⇒ Arbitrary (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(Num a, Ord a, Arbitrary a) ⇒ Arbitrary (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary a ⇒ Arbitrary (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Shrink2 a) Source #

shrinkShrink2 a → [Shrink2 a] Source #

Integral a ⇒ Arbitrary (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Small a) Source #

shrinkSmall a → [Small a] Source #

Arbitrary a ⇒ Arbitrary (Smart a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Smart a) Source #

shrinkSmart a → [Smart a] Source #

(Arbitrary a, Ord a) ⇒ Arbitrary (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary v ⇒ Arbitrary (KeyMap v)

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.KeyMap

Methods

arbitraryGen (KeyMap v) Source #

shrinkKeyMap v → [KeyMap v] Source #

Arbitrary a ⇒ Arbitrary (Complex a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Complex a) Source #

shrinkComplex a → [Complex a] Source #

Arbitrary a ⇒ Arbitrary (First a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

arbitraryGen (First a) Source #

shrinkFirst a → [First a] Source #

Arbitrary a ⇒ Arbitrary (Last a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

arbitraryGen (Last a) Source #

shrinkLast a → [Last a] Source #

Arbitrary a ⇒ Arbitrary (Max a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

arbitraryGen (Max a) Source #

shrinkMax a → [Max a] Source #

Arbitrary a ⇒ Arbitrary (Min a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

arbitraryGen (Min a) Source #

shrinkMin a → [Min a] Source #

Arbitrary a ⇒ Arbitrary (WrappedMonoid a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

DSIGNAlgorithm v ⇒ Arbitrary (SigDSIGN v) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

DSIGNAlgorithm v ⇒ Arbitrary (SignKeyDSIGN v) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

DSIGNAlgorithm v ⇒ Arbitrary (VerKeyDSIGN v) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

(UnsoundPureKESAlgorithm k, Signable k ByteString, Arbitrary (ContextKES k)) ⇒ Arbitrary (SigKES k) 
Instance details

Defined in Test.Crypto.KES

Methods

arbitraryGen (SigKES k) Source #

shrinkSigKES k → [SigKES k] Source #

(UnsoundPureKESAlgorithm k, Arbitrary (ContextKES k)) ⇒ Arbitrary (UnsoundPureSignKeyKES k) 
Instance details

Defined in Test.Crypto.KES

(UnsoundPureKESAlgorithm k, Arbitrary (ContextKES k)) ⇒ Arbitrary (VerKeyKES k) 
Instance details

Defined in Test.Crypto.KES

KnownNat n ⇒ Arbitrary (PinnedSizedBytes n) 
Instance details

Defined in Test.Crypto.Instances

(VRFAlgorithm v, ContextVRF v ~ (), Signable v ~ SignableRepresentation) ⇒ Arbitrary (CertVRF v) 
Instance details

Defined in Test.Crypto.VRF

Methods

arbitraryGen (CertVRF v) Source #

shrinkCertVRF v → [CertVRF v] Source #

VRFAlgorithm v ⇒ Arbitrary (OutputVRF v) 
Instance details

Defined in Test.Crypto.VRF

VRFAlgorithm v ⇒ Arbitrary (SignKeyVRF v) 
Instance details

Defined in Test.Crypto.VRF

VRFAlgorithm v ⇒ Arbitrary (VerKeyVRF v) 
Instance details

Defined in Test.Crypto.VRF

(Era era, EncCBOR (f era), Arbitrary (f era)) ⇒ Arbitrary (Sized (f era)) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (Sized (f era)) Source #

shrinkSized (f era) → [Sized (f era)] Source #

(Twiddle a, Arbitrary a, EncCBOR a) ⇒ Arbitrary (Twiddler a) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Twiddle

Arbitrary (Attributes AddrAttributes) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

(Arbitrary a, HasZero a) ⇒ Arbitrary (NonZero a) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (NonZero a) Source #

shrinkNonZero a → [NonZero a] Source #

Arbitrary (CompactForm Coin) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

(Era era, Arbitrary (PParamsHKD Identity era)) ⇒ Arbitrary (PParams era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (PParams era) Source #

shrinkPParams era → [PParams era] Source #

(Era era, Arbitrary (PParamsHKD StrictMaybe era)) ⇒ Arbitrary (PParamsUpdate era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary (Credential r) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary (NoGenesis era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (NoGenesis era) Source #

shrinkNoGenesis era → [NoGenesis era] Source #

Arbitrary (NoUpdate a) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary (KeyHash r) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (KeyHash r) Source #

shrinkKeyHash r → [KeyHash r] Source #

Arbitrary (SafeHash i) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary (VRFVerKeyHash r) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Arbitrary (VKey kd) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (VKey kd) Source #

shrinkVKey kd → [VKey kd] Source #

Typeable kr ⇒ Arbitrary (WitVKey kr) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (WitVKey kr) Source #

shrinkWitVKey kr → [WitVKey kr] Source #

Era era ⇒ Arbitrary (BinaryData era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (BinaryData era) Source #

shrinkBinaryData era → [BinaryData era] Source #

Era era ⇒ Arbitrary (Data era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (Data era) Source #

shrinkData era → [Data era] Source #

Era era ⇒ Arbitrary (Datum era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (Datum era) Source #

shrinkDatum era → [Datum era] Source #

Arbitrary (CommitteeState era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

(Era era, Arbitrary (Accounts era)) ⇒ Arbitrary (DState era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (DState era) Source #

shrinkDState era → [DState era] Source #

Arbitrary (PState era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (PState era) Source #

shrinkPState era → [PState era] Source #

(EraTxOut era, Arbitrary (TxOut era)) ⇒ Arbitrary (UTxO era) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (UTxO era) Source #

shrinkUTxO era → [UTxO era] Source #

Arbitrary (KeyPair kd) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.KeyPair

Methods

arbitraryGen (KeyPair kd) Source #

shrinkKeyPair kd → [KeyPair kd] Source #

Arbitrary t ⇒ Arbitrary (WithOrigin t) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary e ⇒ Arbitrary (StrictMaybe e) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary e ⇒ Arbitrary (StrictSeq e) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

(FoldCase a, Arbitrary a) ⇒ Arbitrary (CI a) 
Instance details

Defined in Test.QuickCheck.Instances.CaseInsensitive

Methods

arbitraryGen (CI a) Source #

shrinkCI a → [CI a] Source #

Arbitrary a ⇒ Arbitrary (IntMap a)

WARNING: The same warning as for Arbitrary (Set a) applies here.

Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (IntMap a) Source #

shrinkIntMap a → [IntMap a] Source #

Arbitrary a ⇒ Arbitrary (Seq a)

WARNING: The same warning as for Arbitrary (Set a) applies here.

Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Seq a) Source #

shrinkSeq a → [Seq a] Source #

(Ord a, Arbitrary a) ⇒ Arbitrary (Set a)

WARNING: Users working on the internals of the Set type via e.g. Data.Set.Internal should be aware that this instance aims to give a good representation of Set a as mathematical sets but *does not* aim to provide a varied distribution over the underlying representation.

Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Set a) Source #

shrinkSet a → [Set a] Source #

Arbitrary a ⇒ Arbitrary (Tree a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Tree a) Source #

shrinkTree a → [Tree a] Source #

Arbitrary1 f ⇒ Arbitrary (Fix f) 
Instance details

Defined in Test.QuickCheck.Instances.DataFix

Methods

arbitraryGen (Fix f) Source #

shrinkFix f → [Fix f] Source #

(Arbitrary1 f, Functor f) ⇒ Arbitrary (Mu f) 
Instance details

Defined in Test.QuickCheck.Instances.DataFix

Methods

arbitraryGen (Mu f) Source #

shrinkMu f → [Mu f] Source #

(Arbitrary1 f, Functor f) ⇒ Arbitrary (Nu f) 
Instance details

Defined in Test.QuickCheck.Instances.DataFix

Methods

arbitraryGen (Nu f) Source #

shrinkNu f → [Nu f] Source #

(GArbitrary UnsizedOpts a, Weights_ (Rep a) ~ L c0) ⇒ Arbitrary (GenericArbitrarySingle a) 
Instance details

Defined in Generic.Random.DerivingVia

(GArbitrary UnsizedOpts a, GUniformWeight a) ⇒ Arbitrary (GenericArbitraryU a) 
Instance details

Defined in Generic.Random.DerivingVia

Arbitrary a ⇒ Arbitrary (NonEmpty a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Arbitrary a ⇒ Arbitrary (Identity a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Arbitrary a ⇒ Arbitrary (First a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (First a) Source #

shrinkFirst a → [First a] Source #

Arbitrary a ⇒ Arbitrary (Last a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Last a) Source #

shrinkLast a → [Last a] Source #

Arbitrary a ⇒ Arbitrary (Dual a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Dual a) Source #

shrinkDual a → [Dual a] Source #

(Arbitrary a, CoArbitrary a) ⇒ Arbitrary (Endo a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Endo a) Source #

shrinkEndo a → [Endo a] Source #

Arbitrary a ⇒ Arbitrary (Product a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Product a) Source #

shrinkProduct a → [Product a] Source #

Arbitrary a ⇒ Arbitrary (Sum a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Sum a) Source #

shrinkSum a → [Sum a] Source #

Arbitrary a ⇒ Arbitrary (ZipList a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (ZipList a) Source #

shrinkZipList a → [ZipList a] Source #

Integral a ⇒ Arbitrary (Ratio a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Ratio a) Source #

shrinkRatio a → [Ratio a] Source #

(Hashable a, Arbitrary a) ⇒ Arbitrary (Hashed a) 
Instance details

Defined in Test.QuickCheck.Instances.Hashable

Methods

arbitraryGen (Hashed a) Source #

shrinkHashed a → [Hashed a] Source #

Arbitrary (NoArbitrary a)

arbitrary throws, shrink neither throws nor shrinks.

Instance details

Defined in PlutusLedgerApi.Test.V1.Data.Value

Arbitrary a ⇒ Arbitrary (Maybe a)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

arbitraryGen (Maybe a) Source #

shrinkMaybe a → [Maybe a] Source #

(Hashable a, Eq a, Arbitrary a) ⇒ Arbitrary (HashSet a) 
Instance details

Defined in Test.QuickCheck.Instances.UnorderedContainers

Methods

arbitraryGen (HashSet a) Source #

shrinkHashSet a → [HashSet a] Source #

Arbitrary a ⇒ Arbitrary (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

arbitraryGen (Vector a) Source #

shrinkVector a → [Vector a] Source #

(Prim a, Arbitrary a) ⇒ Arbitrary (Vector a)

Since: quickcheck-instances-0.3.32

Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

arbitraryGen (Vector a) Source #

shrinkVector a → [Vector a] Source #

(Storable a, Arbitrary a) ⇒ Arbitrary (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

arbitraryGen (Vector a) Source #

shrinkVector a → [Vector a] Source #

Arbitrary a ⇒ Arbitrary (Vector a)

Since: quickcheck-instances-0.3.33

Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

arbitraryGen (Vector a) Source #

shrinkVector a → [Vector a] Source #

(Unbox a, Arbitrary a) ⇒ Arbitrary (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

arbitraryGen (Vector a) Source #

shrinkVector a → [Vector a] Source #

Arbitrary a ⇒ Arbitrary (Maybe a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Maybe a) Source #

shrinkMaybe a → [Maybe a] Source #

Arbitrary a ⇒ Arbitrary (Solo a) 
Instance details

Defined in Test.QuickCheck.Instances.Solo

Methods

arbitraryGen (Solo a) Source #

shrinkSolo a → [Solo a] Source #

Arbitrary a ⇒ Arbitrary [a] 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen [a] Source #

shrink ∷ [a] → [[a]] Source #

(Function a, CoArbitrary a, Arbitrary b) ⇒ Arbitrary (a :-> b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

arbitraryGen (a :-> b) Source #

shrink ∷ (a :-> b) → [a :-> b] Source #

(Function a, CoArbitrary a, Arbitrary b) ⇒ Arbitrary (Fun a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

arbitraryGen (Fun a b) Source #

shrinkFun a b → [Fun a b] Source #

(Arbitrary a, ShrinkState s a) ⇒ Arbitrary (Shrinking s a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Shrinking s a) Source #

shrinkShrinking s a → [Shrinking s a] Source #

(Num i, Ix i, IArray UArray a, Arbitrary i, Arbitrary a) ⇒ Arbitrary (UArray i a) 
Instance details

Defined in Test.QuickCheck.Instances.Array

Methods

arbitraryGen (UArray i a) Source #

shrinkUArray i a → [UArray i a] Source #

Arbitrary (m a) ⇒ Arbitrary (WrappedMonad m a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

HasResolution a ⇒ Arbitrary (Fixed a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Fixed a) Source #

shrinkFixed a → [Fixed a] Source #

DSIGNAlgorithm v ⇒ Arbitrary (SignedDSIGN v a) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

HashAlgorithm h ⇒ Arbitrary (Hash h a) 
Instance details

Defined in Test.Crypto.Hash

Methods

arbitraryGen (Hash h a) Source #

shrinkHash h a → [Hash h a] Source #

(ContextVRF v ~ (), Signable v ~ SignableRepresentation, VRFAlgorithm v) ⇒ Arbitrary (CertifiedVRF v a) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Arbitrary a ⇒ Arbitrary (Mismatch r a) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.Arbitrary

Methods

arbitraryGen (Mismatch r a) Source #

shrinkMismatch r a → [Mismatch r a] Source #

(Ord k, Arbitrary k, Arbitrary v) ⇒ Arbitrary (Map k v)

WARNING: The same warning as for Arbitrary (Set a) applies here.

Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Map k v) Source #

shrinkMap k v → [Map k v] Source #

(Num i, Ix i, Arbitrary i, Arbitrary a) ⇒ Arbitrary (Array i a) 
Instance details

Defined in Test.QuickCheck.Instances.Array

Methods

arbitraryGen (Array i a) Source #

shrinkArray i a → [Array i a] Source #

(Arbitrary a, Arbitrary b) ⇒ Arbitrary (Either a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Either a b) Source #

shrinkEither a b → [Either a b] Source #

Arbitrary (Proxy a) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

arbitraryGen (Proxy a) Source #

shrinkProxy a → [Proxy a] Source #

(Arbitrary a, Arbitrary b) ⇒ Arbitrary (Either a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

arbitraryGen (Either a b) Source #

shrinkEither a b → [Either a b] Source #

(Arbitrary a, Arbitrary b) ⇒ Arbitrary (These a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

arbitraryGen (These a b) Source #

shrinkThese a b → [These a b] Source #

(Arbitrary a, Arbitrary b) ⇒ Arbitrary (Pair a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

arbitraryGen (Pair a b) Source #

shrinkPair a b → [Pair a b] Source #

(Arbitrary a, Arbitrary b) ⇒ Arbitrary (These a b)

Since: quickcheck-instances-0.3.23

Instance details

Defined in Test.QuickCheck.Instances.These

Methods

arbitraryGen (These a b) Source #

shrinkThese a b → [These a b] Source #

(Arbitrary1 f, Arbitrary a) ⇒ Arbitrary (Lift f a) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

arbitraryGen (Lift f a) Source #

shrinkLift f a → [Lift f a] Source #

(Arbitrary1 m, Arbitrary a) ⇒ Arbitrary (MaybeT m a) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

arbitraryGen (MaybeT m a) Source #

shrinkMaybeT m a → [MaybeT m a] Source #

(Ord k, Arbitrary k, Arbitrary v) ⇒ Arbitrary (OMap k v) 
Instance details

Defined in Data.TreeDiff.OMap

Methods

arbitraryGen (OMap k v) Source #

shrinkOMap k v → [OMap k v] Source #

(Hashable k, Eq k, Arbitrary k, Arbitrary v) ⇒ Arbitrary (HashMap k v) 
Instance details

Defined in Test.QuickCheck.Instances.UnorderedContainers

Methods

arbitraryGen (HashMap k v) Source #

shrinkHashMap k v → [HashMap k v] Source #

(Arbitrary a, Arbitrary b) ⇒ Arbitrary (a, b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b) Source #

shrink ∷ (a, b) → [(a, b)] Source #

(CoArbitrary a, Arbitrary b) ⇒ Arbitrary (a → b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a → b) Source #

shrink ∷ (a → b) → [a → b] Source #

Arbitrary (a b c) ⇒ Arbitrary (WrappedArrow a b c) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (WrappedArrow a b c) Source #

shrinkWrappedArrow a b c → [WrappedArrow a b c] Source #

(Arbitrary (f a), Coercible (f a) a, Generic a, RecursivelyShrink (Rep a), GSubterms (Rep a) a) ⇒ Arbitrary (AndShrinking f a) 
Instance details

Defined in Generic.Random.DerivingVia

(GArbitrary UnsizedOpts a, TypeLevelWeights' weights a) ⇒ Arbitrary (GenericArbitrary weights a) 
Instance details

Defined in Generic.Random.DerivingVia

Methods

arbitraryGen (GenericArbitrary weights a) Source #

shrinkGenericArbitrary weights a → [GenericArbitrary weights a] Source #

(GArbitrary SizedOptsDef a, TypeLevelWeights' weights a) ⇒ Arbitrary (GenericArbitraryRec weights a) 
Instance details

Defined in Generic.Random.DerivingVia

Methods

arbitraryGen (GenericArbitraryRec weights a) Source #

shrinkGenericArbitraryRec weights a → [GenericArbitraryRec weights a] Source #

(GArbitrary (SetGens genList UnsizedOpts) a, Weights_ (Rep a) ~ L c0, TypeLevelGenList genList', genList ~ TypeLevelGenList' genList') ⇒ Arbitrary (GenericArbitrarySingleG genList' a) 
Instance details

Defined in Generic.Random.DerivingVia

(GArbitrary (SetGens genList UnsizedOpts) a, GUniformWeight a, TypeLevelGenList genList', genList ~ TypeLevelGenList' genList') ⇒ Arbitrary (GenericArbitraryUG genList' a) 
Instance details

Defined in Generic.Random.DerivingVia

Methods

arbitraryGen (GenericArbitraryUG genList' a) Source #

shrinkGenericArbitraryUG genList' a → [GenericArbitraryUG genList' a] Source #

Arbitrary a ⇒ Arbitrary (Const a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Const a b) Source #

shrinkConst a b → [Const a b] Source #

Arbitrary (f a) ⇒ Arbitrary (Alt f a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Alt f a) Source #

shrinkAlt f a → [Alt f a] Source #

Arbitrary b ⇒ Arbitrary (Tagged a b) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

arbitraryGen (Tagged a b) Source #

shrinkTagged a b → [Tagged a b] Source #

(Arbitrary1 f, Arbitrary1 g, Arbitrary a) ⇒ Arbitrary (These1 f g a)

Since: quickcheck-instances-0.3.23

Instance details

Defined in Test.QuickCheck.Instances.These

Methods

arbitraryGen (These1 f g a) Source #

shrinkThese1 f g a → [These1 f g a] Source #

(Arbitrary1 f, Arbitrary a) ⇒ Arbitrary (Backwards f a) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

arbitraryGen (Backwards f a) Source #

shrinkBackwards f a → [Backwards f a] Source #

Arbitrary a ⇒ Arbitrary (Constant a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Constant a b) Source #

shrinkConstant a b → [Constant a b] Source #

(Arbitrary1 f, Arbitrary a) ⇒ Arbitrary (Reverse f a) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

arbitraryGen (Reverse f a) Source #

shrinkReverse f a → [Reverse f a] Source #

(Arbitrary a, Arbitrary b, Arbitrary c) ⇒ Arbitrary (a, b, c) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b, c) Source #

shrink ∷ (a, b, c) → [(a, b, c)] Source #

(Arbitrary1 f, Arbitrary1 g, Arbitrary a) ⇒ Arbitrary (Product f g a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Product f g a) Source #

shrinkProduct f g a → [Product f g a] Source #

(Arbitrary1 f, Arbitrary1 g, Arbitrary a) ⇒ Arbitrary (Sum f g a) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

arbitraryGen (Sum f g a) Source #

shrinkSum f g a → [Sum f g a] Source #

(Ord k, Vector kv k, Vector vv v, Arbitrary k, Arbitrary v) ⇒ Arbitrary (VMap kv vv k v) 
Instance details

Defined in Test.Cardano.Ledger.Binary.Arbitrary

Methods

arbitraryGen (VMap kv vv k v) Source #

shrinkVMap kv vv k v → [VMap kv vv k v] Source #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d) ⇒ Arbitrary (a, b, c, d) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b, c, d) Source #

shrink ∷ (a, b, c, d) → [(a, b, c, d)] Source #

(Arbitrary1 f, Arbitrary1 g, Arbitrary a) ⇒ Arbitrary (Compose f g a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (Compose f g a) Source #

shrinkCompose f g a → [Compose f g a] Source #

(GArbitrary (SetGens genList UnsizedOpts) a, GUniformWeight a, TypeLevelWeights' weights a, TypeLevelGenList genList', genList ~ TypeLevelGenList' genList') ⇒ Arbitrary (GenericArbitraryG genList' weights a) 
Instance details

Defined in Generic.Random.DerivingVia

Methods

arbitraryGen (GenericArbitraryG genList' weights a) Source #

shrinkGenericArbitraryG genList' weights a → [GenericArbitraryG genList' weights a] Source #

(GArbitrary (SetGens genList SizedOpts) a, TypeLevelWeights' weights a, TypeLevelGenList genList', genList ~ TypeLevelGenList' genList') ⇒ Arbitrary (GenericArbitraryRecG genList' weights a) 
Instance details

Defined in Generic.Random.DerivingVia

Methods

arbitraryGen (GenericArbitraryRecG genList' weights a) Source #

shrinkGenericArbitraryRecG genList' weights a → [GenericArbitraryRecG genList' weights a] Source #

(GArbitrary opts a, TypeLevelWeights' weights a, TypeLevelOpts opts', opts ~ TypeLevelOpts' opts') ⇒ Arbitrary (GenericArbitraryWith opts' weights a) 
Instance details

Defined in Generic.Random.DerivingVia

Methods

arbitraryGen (GenericArbitraryWith opts' weights a) Source #

shrinkGenericArbitraryWith opts' weights a → [GenericArbitraryWith opts' weights a] Source #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e) ⇒ Arbitrary (a, b, c, d, e) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b, c, d, e) Source #

shrink ∷ (a, b, c, d, e) → [(a, b, c, d, e)] Source #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f) ⇒ Arbitrary (a, b, c, d, e, f) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b, c, d, e, f) Source #

shrink ∷ (a, b, c, d, e, f) → [(a, b, c, d, e, f)] Source #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f, Arbitrary g) ⇒ Arbitrary (a, b, c, d, e, f, g) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b, c, d, e, f, g) Source #

shrink ∷ (a, b, c, d, e, f, g) → [(a, b, c, d, e, f, g)] Source #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f, Arbitrary g, Arbitrary h) ⇒ Arbitrary (a, b, c, d, e, f, g, h) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b, c, d, e, f, g, h) Source #

shrink ∷ (a, b, c, d, e, f, g, h) → [(a, b, c, d, e, f, g, h)] Source #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f, Arbitrary g, Arbitrary h, Arbitrary i) ⇒ Arbitrary (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b, c, d, e, f, g, h, i) Source #

shrink ∷ (a, b, c, d, e, f, g, h, i) → [(a, b, c, d, e, f, g, h, i)] Source #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f, Arbitrary g, Arbitrary h, Arbitrary i, Arbitrary j) ⇒ Arbitrary (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitraryGen (a, b, c, d, e, f, g, h, i, j) Source #

shrink ∷ (a, b, c, d, e, f, g, h, i, j) → [(a, b, c, d, e, f, g, h, i, j)] Source #

data Fun a b Source #

Generation of random shrinkable, showable functions.

To generate random values of type Fun a b, you must have an instance Function a.

See also applyFun, and Fn with GHC >= 7.8.

Constructors

Fun (a :-> b, b, Shrunk) (a → b) 

Instances

Instances details
Functor (Fun a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

fmap ∷ (a0 → b) → Fun a a0 → Fun a b #

(<$) ∷ a0 → Fun a b → Fun a a0 #

(Function a, CoArbitrary a, Arbitrary b) ⇒ Arbitrary (Fun a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

arbitraryGen (Fun a b) Source #

shrinkFun a b → [Fun a b] Source #

(Show a, Show b) ⇒ Show (Fun a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

showsPrecIntFun a b → ShowS #

showFun a b → String #

showList ∷ [Fun a b] → ShowS #

discard ∷ a Source #

A special error value. If a property evaluates discard, it causes QuickCheck to discard the current test case. This can be useful if you want to discard the current test case, but are somewhere you can't use ==>, such as inside a generator.

data Gen a Source #

A generator for values of type a.

The third-party packages QuickCheck-GenT and quickcheck-transformer provide monad transformer versions of Gen.

Instances

Instances details
MonadRandom Gen 
Instance details

Defined in Test.Cardano.Prelude.Orphans

Methods

getRandomBytesByteArray byteArray ⇒ IntGen byteArray Source #

Applicative Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

pure ∷ a → Gen a #

(<*>)Gen (a → b) → Gen a → Gen b #

liftA2 ∷ (a → b → c) → Gen a → Gen b → Gen c #

(*>)Gen a → Gen b → Gen b #

(<*)Gen a → Gen b → Gen a #

Functor Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

fmap ∷ (a → b) → Gen a → Gen b #

(<$) ∷ a → Gen b → Gen a #

Monad Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

(>>=)Gen a → (a → Gen b) → Gen b #

(>>)Gen a → Gen b → Gen b #

return ∷ a → Gen a #

MonadFix Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

mfix ∷ (a → Gen a) → Gen a #

MonadGen Gen 
Instance details

Defined in Test.QuickCheck.GenT

Methods

liftGenGen a → Gen a Source #

variantIntegral n ⇒ n → Gen a → Gen a Source #

sized ∷ (IntGen a) → Gen a Source #

resizeIntGen a → Gen a Source #

chooseRandom a ⇒ (a, a) → Gen a Source #

StatefulGen QC Gen 
Instance details

Defined in Test.Cardano.Ledger.Binary.Random

Arbitrary a ⇒ TypeLevelGenList (Gen a ∷ Type) 
Instance details

Defined in Generic.Random.DerivingVia

Associated Types

type TypeLevelGenList' (Gen a ∷ Type) 
Instance details

Defined in Generic.Random.DerivingVia

type TypeLevelGenList' (Gen a ∷ Type) = Gen a
Testable prop ⇒ Testable (Gen prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

propertyGen prop → Property Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Gen prop) → Property Source #

FindGen ('Match 'INCOHERENT) s (Gen a) gs a

Matching custom generator for a.

Instance details

Defined in Generic.Random.Internal.Generic

Methods

findGen ∷ (Proxy ('Match 'INCOHERENT), Proxy s, FullGenListOf s) → Gen a → gs → Gen a Source #

a ~ a' ⇒ FindGen ('MatchCoh 'True) s (Gen a) gs a' 
Instance details

Defined in Generic.Random.Internal.Generic

Methods

findGen ∷ (Proxy ('MatchCoh 'True), Proxy s, FullGenListOf s) → Gen a → gs → Gen a' Source #

type TypeLevelGenList' (Gen a ∷ Type) 
Instance details

Defined in Generic.Random.DerivingVia

type TypeLevelGenList' (Gen a ∷ Type) = Gen a

variantIntegral n ⇒ n → Gen a → Gen a Source #

Modifies a generator using an integer seed.

sized ∷ (IntGen a) → Gen a Source #

Used to construct generators that depend on the size parameter.

For example, listOf, which uses the size parameter as an upper bound on length of lists it generates, can be defined like this:

listOf :: Gen a -> Gen [a]
listOf gen = sized $ \n ->
  do k <- choose (0,n)
     vectorOf k gen

You can also do this using getSize.

getSizeGen Int Source #

Returns the size parameter. Used to construct generators that depend on the size parameter.

For example, listOf, which uses the size parameter as an upper bound on length of lists it generates, can be defined like this:

listOf :: Gen a -> Gen [a]
listOf gen = do
  n <- getSize
  k <- choose (0,n)
  vectorOf k gen

You can also do this using sized.

resizeHasCallStackIntGen a → Gen a Source #

Overrides the size parameter. Returns a generator which uses the given size instead of the runtime-size parameter.

scale ∷ (IntInt) → Gen a → Gen a Source #

Adjust the size parameter, by transforming it with the given function.

chooseRandom a ⇒ (a, a) → Gen a Source #

Generates a random element in the given inclusive range. For integral and enumerated types, the specialised variants of choose below run much quicker.

chooseAnyRandom a ⇒ Gen a Source #

Generates a random element over the natural range of a.

chooseEnumEnum a ⇒ (a, a) → Gen a Source #

A fast implementation of choose for enumerated types.

chooseInt ∷ (Int, Int) → Gen Int Source #

A fast implementation of choose for Int.

chooseBoundedIntegral ∷ (Bounded a, Integral a) ⇒ (a, a) → Gen a Source #

A fast implementation of choose for bounded integral types.

chooseInteger ∷ (Integer, Integer) → Gen Integer Source #

A fast implementation of choose for Integer.

generateGen a → IO a Source #

Run a generator. The size passed to the generator is always 30; if you want another size then you should explicitly use resize.

sample'Gen a → IO [a] Source #

Generates some example values.

sampleShow a ⇒ Gen a → IO () Source #

Generates some example values and prints them to stdout.

suchThatGen a → (a → Bool) → Gen a Source #

Generates a value that satisfies a predicate.

suchThatMapGen a → (a → Maybe b) → Gen b Source #

Generates a value for which the given function returns a Just, and then applies the function.

suchThatMaybeGen a → (a → Bool) → Gen (Maybe a) Source #

Tries to generate a value that satisfies a predicate. If it fails to do so after enough attempts, returns Nothing.

oneofHasCallStack ⇒ [Gen a] → Gen a Source #

Randomly uses one of the given generators. The input list must be non-empty.

frequencyHasCallStack ⇒ [(Int, Gen a)] → Gen a Source #

Chooses one of the given generators, with a weighted random distribution. The input list must be non-empty.

elementsHasCallStack ⇒ [a] → Gen a Source #

Generates one of the given values. The input list must be non-empty.

sublistOf ∷ [a] → Gen [a] Source #

Generates a random subsequence of the given list.

shuffle ∷ [a] → Gen [a] Source #

Generates a random permutation of the given list.

growingElementsHasCallStack ⇒ [a] → Gen a Source #

Takes a list of elements of increasing size, and chooses among an initial segment of the list. The size of this initial segment increases with the size parameter. The input list must be non-empty.

listOfGen a → Gen [a] Source #

Generates a list of random length. The maximum length depends on the size parameter.

listOf1Gen a → Gen [a] Source #

Generates a non-empty list of random length. The maximum length depends on the size parameter.

vectorOfIntGen a → Gen [a] Source #

Generates a list of the given length.

infiniteListOfGen a → Gen [a] Source #

Generates an infinite list.

class CoArbitrary a where Source #

Used for random generation of functions. You should consider using Fun instead, which can show the generated functions as strings.

If you are using a recent GHC, there is a default definition of coarbitrary using genericCoarbitrary, so if your type has a Generic instance it's enough to say

instance CoArbitrary MyType

You should only use genericCoarbitrary for data types where equality is structural, i.e. if you can't have two different representations of the same value. An example where it's not safe is sets implemented using binary search trees: the same set can be represented as several different trees. Here you would have to explicitly define coarbitrary s = coarbitrary (toList s).

Minimal complete definition

Nothing

Methods

coarbitrary ∷ a → Gen b → Gen b Source #

Used to generate a function of type a -> b. The first argument is a value, the second a generator. You should use variant to perturb the random generator; the goal is that different values for the first argument will lead to different calls to variant. An example will help:

instance CoArbitrary a => CoArbitrary [a] where
  coarbitrary []     = variant 0
  coarbitrary (x:xs) = variant 1 . coarbitrary (x,xs)

default coarbitrary ∷ (Generic a, GCoArbitrary (Rep a)) ⇒ a → Gen b → Gen b Source #

Instances

Instances details
CoArbitrary A 
Instance details

Defined in Test.QuickCheck.Poly

Methods

coarbitraryAGen b → Gen b Source #

CoArbitrary B 
Instance details

Defined in Test.QuickCheck.Poly

Methods

coarbitraryBGen b → Gen b Source #

CoArbitrary C 
Instance details

Defined in Test.QuickCheck.Poly

Methods

coarbitraryCGen b → Gen b Source #

CoArbitrary OrdA 
Instance details

Defined in Test.QuickCheck.Poly

Methods

coarbitraryOrdAGen b → Gen b Source #

CoArbitrary OrdB 
Instance details

Defined in Test.QuickCheck.Poly

Methods

coarbitraryOrdBGen b → Gen b Source #

CoArbitrary OrdC 
Instance details

Defined in Test.QuickCheck.Poly

Methods

coarbitraryOrdCGen b → Gen b Source #

CoArbitrary Key

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.Key

Methods

coarbitraryKeyGen b → Gen b Source #

CoArbitrary Value

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.Types.Internal

Methods

coarbitraryValueGen b → Gen b Source #

CoArbitrary ByteArray

Since: quickcheck-instances-0.3.28

Instance details

Defined in Test.QuickCheck.Instances.Primitive

Methods

coarbitraryByteArrayGen b → Gen b Source #

CoArbitrary ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Methods

coarbitraryByteString64Gen b → Gen b Source #

CoArbitrary ByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Methods

coarbitraryByteStringGen b → Gen b Source #

CoArbitrary ByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Methods

coarbitraryByteStringGen b → Gen b Source #

CoArbitrary ShortByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Methods

coarbitraryShortByteStringGen b → Gen b Source #

CoArbitrary IntSet 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryIntSetGen b → Gen b Source #

CoArbitrary Void 
Instance details

Defined in Test.QuickCheck.Instances.Void

Methods

coarbitraryVoidGen b → Gen b Source #

CoArbitrary All 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryAllGen b → Gen b Source #

CoArbitrary Any 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryAnyGen b → Gen b Source #

CoArbitrary Version 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryVersionGen b → Gen b Source #

CoArbitrary Newline 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryNewlineGen b → Gen b Source #

CoArbitrary NewlineMode 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryNewlineModeGen b → Gen b Source #

CoArbitrary Int16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryInt16Gen b → Gen b Source #

CoArbitrary Int32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryInt32Gen b → Gen b Source #

CoArbitrary Int64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryInt64Gen b → Gen b Source #

CoArbitrary Int8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryInt8Gen b → Gen b Source #

CoArbitrary Word16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryWord16Gen b → Gen b Source #

CoArbitrary Word32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryWord32Gen b → Gen b Source #

CoArbitrary Word64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryWord64Gen b → Gen b Source #

CoArbitrary Word8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryWord8Gen b → Gen b Source #

CoArbitrary Ordering 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryOrderingGen b → Gen b Source #

CoArbitrary CalendarTime 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Methods

coarbitraryCalendarTimeGen b → Gen b Source #

CoArbitrary ClockTime 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Methods

coarbitraryClockTimeGen b → Gen b Source #

CoArbitrary Day 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Methods

coarbitraryDayGen b → Gen b Source #

CoArbitrary Month 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Methods

coarbitraryMonthGen b → Gen b Source #

CoArbitrary TimeDiff 
Instance details

Defined in Test.QuickCheck.Instances.OldTime

Methods

coarbitraryTimeDiffGen b → Gen b Source #

CoArbitrary Scientific 
Instance details

Defined in Test.QuickCheck.Instances.Scientific

Methods

coarbitraryScientificGen b → Gen b Source #

CoArbitrary Text 
Instance details

Defined in Test.QuickCheck.Instances.Text

Methods

coarbitraryTextGen b → Gen b Source #

CoArbitrary Text 
Instance details

Defined in Test.QuickCheck.Instances.Text

Methods

coarbitraryTextGen b → Gen b Source #

CoArbitrary ShortText 
Instance details

Defined in Test.QuickCheck.Instances.Text.Short

Methods

coarbitraryShortTextGen b → Gen b Source #

CoArbitrary CalendarDiffDays 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryCalendarDiffDaysGen b → Gen b Source #

CoArbitrary Day 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryDayGen b → Gen b Source #

CoArbitrary Month 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryMonthGen b → Gen b Source #

CoArbitrary Quarter 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryQuarterGen b → Gen b Source #

CoArbitrary QuarterOfYear 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryQuarterOfYearGen b → Gen b Source #

CoArbitrary DayOfWeek 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryDayOfWeekGen b → Gen b Source #

CoArbitrary AbsoluteTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryAbsoluteTimeGen b → Gen b Source #

CoArbitrary DiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryDiffTimeGen b → Gen b Source #

CoArbitrary NominalDiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryNominalDiffTimeGen b → Gen b Source #

CoArbitrary SystemTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitrarySystemTimeGen b → Gen b Source #

CoArbitrary UTCTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryUTCTimeGen b → Gen b Source #

CoArbitrary UniversalTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryUniversalTimeGen b → Gen b Source #

CoArbitrary CalendarDiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryCalendarDiffTimeGen b → Gen b Source #

CoArbitrary LocalTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryLocalTimeGen b → Gen b Source #

CoArbitrary TimeOfDay 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryTimeOfDayGen b → Gen b Source #

CoArbitrary TimeZone 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryTimeZoneGen b → Gen b Source #

CoArbitrary ZonedTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

coarbitraryZonedTimeGen b → Gen b Source #

CoArbitrary UUID 
Instance details

Defined in Test.QuickCheck.Instances.UUID

Methods

coarbitraryUUIDGen b → Gen b Source #

CoArbitrary Integer 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryIntegerGen b → Gen b Source #

CoArbitrary Natural 
Instance details

Defined in Test.QuickCheck.Instances.Natural

Methods

coarbitraryNaturalGen b → Gen b Source #

CoArbitrary () 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary ∷ () → Gen b → Gen b Source #

CoArbitrary Bool 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryBoolGen b → Gen b Source #

CoArbitrary Char 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryCharGen b → Gen b Source #

CoArbitrary Double 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryDoubleGen b → Gen b Source #

CoArbitrary Float 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryFloatGen b → Gen b Source #

CoArbitrary Int 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryIntGen b → Gen b Source #

CoArbitrary Word 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryWordGen b → Gen b Source #

CoArbitrary v ⇒ CoArbitrary (KeyMap v)

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.KeyMap

Methods

coarbitraryKeyMap v → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Complex a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryComplex a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (First a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

coarbitraryFirst a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Last a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

coarbitraryLast a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Max a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

coarbitraryMax a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Min a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

coarbitraryMin a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (WrappedMonoid a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

coarbitraryWrappedMonoid a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (CI a) 
Instance details

Defined in Test.QuickCheck.Instances.CaseInsensitive

Methods

coarbitraryCI a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (IntMap a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryIntMap a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Seq a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrarySeq a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Set a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrarySet a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Tree a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryTree a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (NonEmpty a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

coarbitraryNonEmpty a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Identity a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryIdentity a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (First a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryFirst a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Last a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryLast a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Dual a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryDual a → Gen b → Gen b Source #

(Arbitrary a, CoArbitrary a) ⇒ CoArbitrary (Endo a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryEndo a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Product a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryProduct a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Sum a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrarySum a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (ZipList a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryZipList a → Gen b → Gen b Source #

(Integral a, CoArbitrary a) ⇒ CoArbitrary (Ratio a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryRatio a → Gen b → Gen b Source #

CoArbitrary (Hashed a) 
Instance details

Defined in Test.QuickCheck.Instances.Hashable

Methods

coarbitraryHashed a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Maybe a)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

coarbitraryMaybe a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (HashSet a) 
Instance details

Defined in Test.QuickCheck.Instances.UnorderedContainers

Methods

coarbitraryHashSet a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

coarbitraryVector a → Gen b → Gen b Source #

(Prim a, CoArbitrary a) ⇒ CoArbitrary (Vector a)

Since: quickcheck-instances-0.3.32

Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

coarbitraryVector a → Gen b → Gen b Source #

(Storable a, CoArbitrary a) ⇒ CoArbitrary (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

coarbitraryVector a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Vector a)

Since: quickcheck-instances-0.3.33

Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

coarbitraryVector a → Gen b → Gen b Source #

(Unbox a, CoArbitrary a) ⇒ CoArbitrary (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

coarbitraryVector a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Maybe a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryMaybe a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary (Solo a) 
Instance details

Defined in Test.QuickCheck.Instances.Solo

Methods

coarbitrarySolo a → Gen b → Gen b Source #

CoArbitrary a ⇒ CoArbitrary [a] 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary ∷ [a] → Gen b → Gen b Source #

(Ix i, IArray UArray a, CoArbitrary i, CoArbitrary a) ⇒ CoArbitrary (UArray i a) 
Instance details

Defined in Test.QuickCheck.Instances.Array

Methods

coarbitraryUArray i a → Gen b → Gen b Source #

HasResolution a ⇒ CoArbitrary (Fixed a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryFixed a → Gen b → Gen b Source #

(CoArbitrary k, CoArbitrary v) ⇒ CoArbitrary (Map k v) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryMap k v → Gen b → Gen b Source #

(Ix i, CoArbitrary i, CoArbitrary a) ⇒ CoArbitrary (Array i a) 
Instance details

Defined in Test.QuickCheck.Instances.Array

Methods

coarbitraryArray i a → Gen b → Gen b Source #

(CoArbitrary a, CoArbitrary b) ⇒ CoArbitrary (Either a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryEither a b → Gen b0 → Gen b0 Source #

CoArbitrary (Proxy a) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

coarbitraryProxy a → Gen b → Gen b Source #

(CoArbitrary a, CoArbitrary b) ⇒ CoArbitrary (Either a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

coarbitraryEither a b → Gen b0 → Gen b0 Source #

(CoArbitrary a, CoArbitrary b) ⇒ CoArbitrary (These a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

coarbitraryThese a b → Gen b0 → Gen b0 Source #

(CoArbitrary a, CoArbitrary b) ⇒ CoArbitrary (Pair a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

coarbitraryPair a b → Gen b0 → Gen b0 Source #

(CoArbitrary a, CoArbitrary b) ⇒ CoArbitrary (These a b)

Since: quickcheck-instances-0.3.23

Instance details

Defined in Test.QuickCheck.Instances.These

Methods

coarbitraryThese a b → Gen b0 → Gen b0 Source #

(CoArbitrary k, CoArbitrary v) ⇒ CoArbitrary (HashMap k v) 
Instance details

Defined in Test.QuickCheck.Instances.UnorderedContainers

Methods

coarbitraryHashMap k v → Gen b → Gen b Source #

(CoArbitrary a, CoArbitrary b) ⇒ CoArbitrary (a, b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary ∷ (a, b) → Gen b0 → Gen b0 Source #

(Arbitrary a, CoArbitrary b) ⇒ CoArbitrary (a → b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary ∷ (a → b) → Gen b0 → Gen b0 Source #

CoArbitrary a ⇒ CoArbitrary (Const a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryConst a b → Gen b0 → Gen b0 Source #

CoArbitrary (f a) ⇒ CoArbitrary (Alt f a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryAlt f a → Gen b → Gen b Source #

CoArbitrary b ⇒ CoArbitrary (Tagged a b) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

coarbitraryTagged a b → Gen b0 → Gen b0 Source #

CoArbitrary a ⇒ CoArbitrary (Constant a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitraryConstant a b → Gen b0 → Gen b0 Source #

(CoArbitrary a, CoArbitrary b, CoArbitrary c) ⇒ CoArbitrary (a, b, c) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary ∷ (a, b, c) → Gen b0 → Gen b0 Source #

(CoArbitrary a, CoArbitrary b, CoArbitrary c, CoArbitrary d) ⇒ CoArbitrary (a, b, c, d) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary ∷ (a, b, c, d) → Gen b0 → Gen b0 Source #

(CoArbitrary a, CoArbitrary b, CoArbitrary c, CoArbitrary d, CoArbitrary e) ⇒ CoArbitrary (a, b, c, d, e) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary ∷ (a, b, c, d, e) → Gen b0 → Gen b0 Source #

class Arbitrary2 (f ∷ TypeTypeType) where Source #

Lifting of the Arbitrary class to binary type constructors.

Minimal complete definition

liftArbitrary2

Methods

liftArbitrary2Gen a → Gen b → Gen (f a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → f a b → [f a b] Source #

Instances

Instances details
Arbitrary2 Either 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2Gen a → Gen b → Gen (Either a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → Either a b → [Either a b] Source #

Arbitrary2 Either

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

liftArbitrary2Gen a → Gen b → Gen (Either a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → Either a b → [Either a b] Source #

Arbitrary2 These

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

liftArbitrary2Gen a → Gen b → Gen (These a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → These a b → [These a b] Source #

Arbitrary2 Pair

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

liftArbitrary2Gen a → Gen b → Gen (Pair a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → Pair a b → [Pair a b] Source #

Arbitrary2 These

Since: quickcheck-instances-0.3.23

Instance details

Defined in Test.QuickCheck.Instances.These

Methods

liftArbitrary2Gen a → Gen b → Gen (These a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → These a b → [These a b] Source #

Arbitrary2 (,) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2Gen a → Gen b → Gen (a, b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → (a, b) → [(a, b)] Source #

Arbitrary2 (ConstTypeTypeType) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2Gen a → Gen b → Gen (Const a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → Const a b → [Const a b] Source #

Arbitrary2 (TaggedTypeTypeType) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

liftArbitrary2Gen a → Gen b → Gen (Tagged a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → Tagged a b → [Tagged a b] Source #

Arbitrary2 (ConstantTypeTypeType) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2Gen a → Gen b → Gen (Constant a b) Source #

liftShrink2 ∷ (a → [a]) → (b → [b]) → Constant a b → [Constant a b] Source #

class Arbitrary1 (f ∷ TypeType) where Source #

Lifting of the Arbitrary class to unary type constructors.

Minimal complete definition

liftArbitrary

Methods

liftArbitraryGen a → Gen (f a) Source #

liftShrink ∷ (a → [a]) → f a → [f a] Source #

Instances

Instances details
Arbitrary1 KeyMap

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.KeyMap

Methods

liftArbitraryGen a → Gen (KeyMap a) Source #

liftShrink ∷ (a → [a]) → KeyMap a → [KeyMap a] Source #

Arbitrary1 First 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

liftArbitraryGen a → Gen (First a) Source #

liftShrink ∷ (a → [a]) → First a → [First a] Source #

Arbitrary1 Last 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

liftArbitraryGen a → Gen (Last a) Source #

liftShrink ∷ (a → [a]) → Last a → [Last a] Source #

Arbitrary1 Max 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

liftArbitraryGen a → Gen (Max a) Source #

liftShrink ∷ (a → [a]) → Max a → [Max a] Source #

Arbitrary1 Min 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

liftArbitraryGen a → Gen (Min a) Source #

liftShrink ∷ (a → [a]) → Min a → [Min a] Source #

Arbitrary1 WrappedMonoid 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

liftArbitraryGen a → Gen (WrappedMonoid a) Source #

liftShrink ∷ (a → [a]) → WrappedMonoid a → [WrappedMonoid a] Source #

Arbitrary1 IntMap

WARNING: The same warning as for Arbitrary (Set a) applies here.

Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (IntMap a) Source #

liftShrink ∷ (a → [a]) → IntMap a → [IntMap a] Source #

Arbitrary1 Seq 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (Seq a) Source #

liftShrink ∷ (a → [a]) → Seq a → [Seq a] Source #

Arbitrary1 Tree 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (Tree a) Source #

liftShrink ∷ (a → [a]) → Tree a → [Tree a] Source #

Arbitrary1 NonEmpty 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

liftArbitraryGen a → Gen (NonEmpty a) Source #

liftShrink ∷ (a → [a]) → NonEmpty a → [NonEmpty a] Source #

Arbitrary1 Identity 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (Identity a) Source #

liftShrink ∷ (a → [a]) → Identity a → [Identity a] Source #

Arbitrary1 ZipList 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (ZipList a) Source #

liftShrink ∷ (a → [a]) → ZipList a → [ZipList a] Source #

Arbitrary1 Maybe

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

liftArbitraryGen a → Gen (Maybe a) Source #

liftShrink ∷ (a → [a]) → Maybe a → [Maybe a] Source #

Arbitrary1 Vector 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

liftArbitraryGen a → Gen (Vector a) Source #

liftShrink ∷ (a → [a]) → Vector a → [Vector a] Source #

Arbitrary1 Maybe 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (Maybe a) Source #

liftShrink ∷ (a → [a]) → Maybe a → [Maybe a] Source #

Arbitrary1 Solo 
Instance details

Defined in Test.QuickCheck.Instances.Solo

Methods

liftArbitraryGen a → Gen (Solo a) Source #

liftShrink ∷ (a → [a]) → Solo a → [Solo a] Source #

Arbitrary1 [] 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen [a] Source #

liftShrink ∷ (a → [a]) → [a] → [[a]] Source #

(Ord k, Arbitrary k) ⇒ Arbitrary1 (Map k) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (Map k a) Source #

liftShrink ∷ (a → [a]) → Map k a → [Map k a] Source #

(Num i, Ix i, Arbitrary i) ⇒ Arbitrary1 (Array i) 
Instance details

Defined in Test.QuickCheck.Instances.Array

Methods

liftArbitraryGen a → Gen (Array i a) Source #

liftShrink ∷ (a → [a]) → Array i a → [Array i a] Source #

Arbitrary a ⇒ Arbitrary1 (Either a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a0 → Gen (Either a a0) Source #

liftShrink ∷ (a0 → [a0]) → Either a a0 → [Either a a0] Source #

Arbitrary1 (ProxyTypeType) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

liftArbitraryGen a → Gen (Proxy a) Source #

liftShrink ∷ (a → [a]) → Proxy a → [Proxy a] Source #

Arbitrary a ⇒ Arbitrary1 (Either a)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

liftArbitraryGen a0 → Gen (Either a a0) Source #

liftShrink ∷ (a0 → [a0]) → Either a a0 → [Either a a0] Source #

Arbitrary a ⇒ Arbitrary1 (These a)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

liftArbitraryGen a0 → Gen (These a a0) Source #

liftShrink ∷ (a0 → [a0]) → These a a0 → [These a a0] Source #

Arbitrary a ⇒ Arbitrary1 (Pair a)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

liftArbitraryGen a0 → Gen (Pair a a0) Source #

liftShrink ∷ (a0 → [a0]) → Pair a a0 → [Pair a a0] Source #

Arbitrary a ⇒ Arbitrary1 (These a)

Since: quickcheck-instances-0.3.23

Instance details

Defined in Test.QuickCheck.Instances.These

Methods

liftArbitraryGen a0 → Gen (These a a0) Source #

liftShrink ∷ (a0 → [a0]) → These a a0 → [These a a0] Source #

Arbitrary1 f ⇒ Arbitrary1 (Lift f) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

liftArbitraryGen a → Gen (Lift f a) Source #

liftShrink ∷ (a → [a]) → Lift f a → [Lift f a] Source #

Arbitrary1 m ⇒ Arbitrary1 (MaybeT m) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

liftArbitraryGen a → Gen (MaybeT m a) Source #

liftShrink ∷ (a → [a]) → MaybeT m a → [MaybeT m a] Source #

(Ord k, Arbitrary k) ⇒ Arbitrary1 (OMap k) 
Instance details

Defined in Data.TreeDiff.OMap

Methods

liftArbitraryGen a → Gen (OMap k a) Source #

liftShrink ∷ (a → [a]) → OMap k a → [OMap k a] Source #

(Hashable k, Eq k, Arbitrary k) ⇒ Arbitrary1 (HashMap k) 
Instance details

Defined in Test.QuickCheck.Instances.UnorderedContainers

Methods

liftArbitraryGen a → Gen (HashMap k a) Source #

liftShrink ∷ (a → [a]) → HashMap k a → [HashMap k a] Source #

Arbitrary a ⇒ Arbitrary1 ((,) a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a0 → Gen (a, a0) Source #

liftShrink ∷ (a0 → [a0]) → (a, a0) → [(a, a0)] Source #

Arbitrary a ⇒ Arbitrary1 (Const a ∷ TypeType) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a0 → Gen (Const a a0) Source #

liftShrink ∷ (a0 → [a0]) → Const a a0 → [Const a a0] Source #

Arbitrary1 (Tagged a) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

liftArbitraryGen a0 → Gen (Tagged a a0) Source #

liftShrink ∷ (a0 → [a0]) → Tagged a a0 → [Tagged a a0] Source #

(Arbitrary1 f, Arbitrary1 g) ⇒ Arbitrary1 (These1 f g)

Since: quickcheck-instances-0.3.23

Instance details

Defined in Test.QuickCheck.Instances.These

Methods

liftArbitraryGen a → Gen (These1 f g a) Source #

liftShrink ∷ (a → [a]) → These1 f g a → [These1 f g a] Source #

Arbitrary1 f ⇒ Arbitrary1 (Backwards f) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

liftArbitraryGen a → Gen (Backwards f a) Source #

liftShrink ∷ (a → [a]) → Backwards f a → [Backwards f a] Source #

Arbitrary a ⇒ Arbitrary1 (Constant a ∷ TypeType) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a0 → Gen (Constant a a0) Source #

liftShrink ∷ (a0 → [a0]) → Constant a a0 → [Constant a a0] Source #

Arbitrary1 f ⇒ Arbitrary1 (Reverse f) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

liftArbitraryGen a → Gen (Reverse f a) Source #

liftShrink ∷ (a → [a]) → Reverse f a → [Reverse f a] Source #

(Arbitrary1 f, Arbitrary1 g) ⇒ Arbitrary1 (Product f g) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (Product f g a) Source #

liftShrink ∷ (a → [a]) → Product f g a → [Product f g a] Source #

(Arbitrary1 f, Arbitrary1 g) ⇒ Arbitrary1 (Sum f g) 
Instance details

Defined in Test.QuickCheck.Instances.Transformer

Methods

liftArbitraryGen a → Gen (Sum f g a) Source #

liftShrink ∷ (a → [a]) → Sum f g a → [Sum f g a] Source #

CoArbitrary a ⇒ Arbitrary1 ((->) a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a0 → Gen (a -> a0) Source #

liftShrink ∷ (a0 → [a0]) → (a -> a0) → [a -> a0] Source #

(Arbitrary1 f, Arbitrary1 g) ⇒ Arbitrary1 (Compose f g) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitraryGen a → Gen (Compose f g a) Source #

liftShrink ∷ (a → [a]) → Compose f g a → [Compose f g a] Source #

arbitrary1 ∷ (Arbitrary1 f, Arbitrary a) ⇒ Gen (f a) Source #

shrink1 ∷ (Arbitrary1 f, Arbitrary a) ⇒ f a → [f a] Source #

arbitrary2 ∷ (Arbitrary2 f, Arbitrary a, Arbitrary b) ⇒ Gen (f a b) Source #

shrink2 ∷ (Arbitrary2 f, Arbitrary a, Arbitrary b) ⇒ f a b → [f a b] Source #

genericShrink ∷ (Generic a, RecursivelyShrink (Rep a), GSubterms (Rep a) a) ⇒ a → [a] Source #

Shrink a term to any of its immediate subterms, and also recursively shrink all subterms.

recursivelyShrink ∷ (Generic a, RecursivelyShrink (Rep a)) ⇒ a → [a] Source #

Recursively shrink all immediate subterms.

subterms ∷ (Generic a, GSubterms (Rep a) a) ⇒ a → [a] Source #

All immediate subterms of a term.

shrinkList ∷ (a → [a]) → [a] → [[a]] Source #

Shrink a list of values given a shrinking function for individual values.

applyArbitrary2 ∷ (Arbitrary a, Arbitrary b) ⇒ (a → b → r) → Gen r Source #

Apply a binary function to random arguments.

applyArbitrary3 ∷ (Arbitrary a, Arbitrary b, Arbitrary c) ⇒ (a → b → c → r) → Gen r Source #

Apply a ternary function to random arguments.

applyArbitrary4 ∷ (Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d) ⇒ (a → b → c → d → r) → Gen r Source #

Apply a function of arity 4 to random arguments.

arbitrarySizedIntegralIntegral a ⇒ Gen a Source #

Generates an integral number. The number can be positive or negative and its maximum absolute value depends on the size parameter.

arbitrarySizedNaturalIntegral a ⇒ Gen a Source #

Generates a natural number. The number's maximum value depends on the size parameter.

arbitrarySizedFractionalFractional a ⇒ Gen a Source #

Uniformly generates a fractional number. The number can be positive or negative and its maximum absolute value depends on the size parameter.

arbitraryBoundedIntegral ∷ (Bounded a, Integral a) ⇒ Gen a Source #

Generates an integral number. The number is chosen uniformly from the entire range of the type. You may want to use arbitrarySizedBoundedIntegral instead.

arbitraryBoundedRandom ∷ (Bounded a, Random a) ⇒ Gen a Source #

Generates an element of a bounded type. The element is chosen from the entire range of the type.

arbitraryBoundedEnum ∷ (Bounded a, Enum a) ⇒ Gen a Source #

Generates an element of a bounded enumeration.

arbitrarySizedBoundedIntegral ∷ (Bounded a, Integral a) ⇒ Gen a Source #

Generates an integral number from a bounded domain. The number is chosen from the entire range of the type, but small numbers are generated more often than big numbers. Inspired by demands from Phil Wadler.

arbitraryUnicodeCharGen Char Source #

Generates any Unicode character (but not a surrogate)

arbitraryASCIICharGen Char Source #

Generates a random ASCII character (0-127).

arbitraryPrintableCharGen Char Source #

Generates a printable Unicode character.

shrinkNothing ∷ a → [a] Source #

Returns no shrinking alternatives.

shrinkMapArbitrary a ⇒ (a → b) → (b → a) → b → [b] Source #

Map a shrink function to another domain. This is handy if your data type has special invariants, but is almost isomorphic to some other type.

shrinkOrderedList :: (Ord a, Arbitrary a) => [a] -> [[a]]
shrinkOrderedList = shrinkMap sort id

shrinkSet :: (Ord a, Arbitrary a) => Set a -> [Set a]
shrinkSet = shrinkMap fromList toList

shrinkMapBy ∷ (a → b) → (b → a) → (a → [a]) → b → [b] Source #

Non-overloaded version of shrinkMap.

shrinkIntegralIntegral a ⇒ a → [a] Source #

Shrink an integral number.

shrinkBoundedEnum ∷ (Bounded a, Enum a, Eq a) ⇒ a → [a] Source #

Shrink an element of a bounded enumeration.

Example

Expand
data MyEnum = E0 | E1 | E2 | E3 | E4 | E5 | E6 | E7 | E8 | E9
   deriving (Bounded, Enum, Eq, Ord, Show)
>>> shrinkBoundedEnum E9
[E0,E5,E7,E8]
>>> shrinkBoundedEnum E5
[E0,E3,E4]
>>> shrinkBoundedEnum E0
[]

shrinkRealFracRealFrac a ⇒ a → [a] Source #

Shrink a fraction, preferring numbers with smaller numerators or denominators. See also shrinkDecimal.

shrinkDecimalRealFrac a ⇒ a → [a] Source #

Shrink a real number, preferring numbers with shorter decimal representations. See also shrinkRealFrac.

genericCoarbitrary ∷ (Generic a, GCoArbitrary (Rep a)) ⇒ a → Gen b → Gen b Source #

Generic CoArbitrary implementation.

(><) ∷ (Gen a → Gen a) → (Gen a → Gen a) → Gen a → Gen a Source #

Combine two generator perturbing functions, for example the results of calls to variant or coarbitrary.

coarbitraryIntegralIntegral a ⇒ a → Gen b → Gen b Source #

A coarbitrary implementation for integral numbers.

coarbitraryRealReal a ⇒ a → Gen b → Gen b Source #

A coarbitrary implementation for real numbers.

coarbitraryShowShow a ⇒ a → Gen b → Gen b Source #

coarbitrary helper for lazy people :-).

coarbitraryEnumEnum a ⇒ a → Gen b → Gen b Source #

A coarbitrary implementation for enums.

orderedList ∷ (Ord a, Arbitrary a) ⇒ Gen [a] Source #

Generates an ordered list.

infiniteListArbitrary a ⇒ Gen [a] Source #

Generates an infinite list.

newtype PrintableString Source #

PrintableString: generates a printable unicode String. The string will not contain surrogate pairs.

Constructors

PrintableString 

newtype UnicodeString Source #

UnicodeString: generates a unicode String. The string will not contain surrogate pairs.

Constructors

UnicodeString 

newtype ASCIIString Source #

ASCIIString: generates an ASCII string.

Constructors

ASCIIString 

class ShrinkState s a where Source #

Methods

shrinkInit ∷ a → s Source #

shrinkState ∷ a → s → [(a, s)] Source #

data Shrinking s a Source #

Shrinking _ x: allows for maintaining a state during shrinking.

Constructors

Shrinking s a 

Instances

Instances details
Functor (Shrinking s) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Shrinking s a → Shrinking s b #

(<$) ∷ a → Shrinking s b → Shrinking s a #

(Arbitrary a, ShrinkState s a) ⇒ Arbitrary (Shrinking s a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Shrinking s a) Source #

shrinkShrinking s a → [Shrinking s a] Source #

Show a ⇒ Show (Shrinking s a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntShrinking s a → ShowS #

showShrinking s a → String #

showList ∷ [Shrinking s a] → ShowS #

data Smart a Source #

Smart _ x: tries a different order when shrinking.

Constructors

Smart Int a 

Instances

Instances details
Functor Smart 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Smart a → Smart b #

(<$) ∷ a → Smart b → Smart a #

Arbitrary a ⇒ Arbitrary (Smart a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Smart a) Source #

shrinkSmart a → [Smart a] Source #

Show a ⇒ Show (Smart a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntSmart a → ShowS #

showSmart a → String #

showList ∷ [Smart a] → ShowS #

newtype Shrink2 a Source #

Shrink2 x: allows 2 shrinking steps at the same time when shrinking x

Constructors

Shrink2 

Fields

Instances

Instances details
Functor Shrink2 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Shrink2 a → Shrink2 b #

(<$) ∷ a → Shrink2 b → Shrink2 a #

Arbitrary a ⇒ Arbitrary (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Shrink2 a) Source #

shrinkShrink2 a → [Shrink2 a] Source #

Enum a ⇒ Enum (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succShrink2 a → Shrink2 a #

predShrink2 a → Shrink2 a #

toEnumIntShrink2 a #

fromEnumShrink2 a → Int #

enumFromShrink2 a → [Shrink2 a] #

enumFromThenShrink2 a → Shrink2 a → [Shrink2 a] #

enumFromToShrink2 a → Shrink2 a → [Shrink2 a] #

enumFromThenToShrink2 a → Shrink2 a → Shrink2 a → [Shrink2 a] #

Num a ⇒ Num (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+)Shrink2 a → Shrink2 a → Shrink2 a #

(-)Shrink2 a → Shrink2 a → Shrink2 a #

(*)Shrink2 a → Shrink2 a → Shrink2 a #

negateShrink2 a → Shrink2 a #

absShrink2 a → Shrink2 a #

signumShrink2 a → Shrink2 a #

fromIntegerIntegerShrink2 a #

Read a ⇒ Read (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Integral a ⇒ Integral (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quotShrink2 a → Shrink2 a → Shrink2 a #

remShrink2 a → Shrink2 a → Shrink2 a #

divShrink2 a → Shrink2 a → Shrink2 a #

modShrink2 a → Shrink2 a → Shrink2 a #

quotRemShrink2 a → Shrink2 a → (Shrink2 a, Shrink2 a) #

divModShrink2 a → Shrink2 a → (Shrink2 a, Shrink2 a) #

toIntegerShrink2 a → Integer #

Real a ⇒ Real (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRationalShrink2 a → Rational #

Show a ⇒ Show (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntShrink2 a → ShowS #

showShrink2 a → String #

showList ∷ [Shrink2 a] → ShowS #

Eq a ⇒ Eq (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)Shrink2 a → Shrink2 a → Bool #

(/=)Shrink2 a → Shrink2 a → Bool #

Ord a ⇒ Ord (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compareShrink2 a → Shrink2 a → Ordering #

(<)Shrink2 a → Shrink2 a → Bool #

(<=)Shrink2 a → Shrink2 a → Bool #

(>)Shrink2 a → Shrink2 a → Bool #

(>=)Shrink2 a → Shrink2 a → Bool #

maxShrink2 a → Shrink2 a → Shrink2 a #

minShrink2 a → Shrink2 a → Shrink2 a #

newtype Small a Source #

Small x: generates values of x drawn from a small range. The opposite of Large.

Constructors

Small 

Fields

Instances

Instances details
Functor Small 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Small a → Small b #

(<$) ∷ a → Small b → Small a #

Integral a ⇒ Arbitrary (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Small a) Source #

shrinkSmall a → [Small a] Source #

Enum a ⇒ Enum (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succSmall a → Small a #

predSmall a → Small a #

toEnumIntSmall a #

fromEnumSmall a → Int #

enumFromSmall a → [Small a] #

enumFromThenSmall a → Small a → [Small a] #

enumFromToSmall a → Small a → [Small a] #

enumFromThenToSmall a → Small a → Small a → [Small a] #

Ix a ⇒ Ix (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

range ∷ (Small a, Small a) → [Small a] #

index ∷ (Small a, Small a) → Small a → Int #

unsafeIndex ∷ (Small a, Small a) → Small a → Int #

inRange ∷ (Small a, Small a) → Small a → Bool #

rangeSize ∷ (Small a, Small a) → Int #

unsafeRangeSize ∷ (Small a, Small a) → Int #

Num a ⇒ Num (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+)Small a → Small a → Small a #

(-)Small a → Small a → Small a #

(*)Small a → Small a → Small a #

negateSmall a → Small a #

absSmall a → Small a #

signumSmall a → Small a #

fromIntegerIntegerSmall a #

Read a ⇒ Read (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Integral a ⇒ Integral (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quotSmall a → Small a → Small a #

remSmall a → Small a → Small a #

divSmall a → Small a → Small a #

modSmall a → Small a → Small a #

quotRemSmall a → Small a → (Small a, Small a) #

divModSmall a → Small a → (Small a, Small a) #

toIntegerSmall a → Integer #

Real a ⇒ Real (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRationalSmall a → Rational #

Show a ⇒ Show (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntSmall a → ShowS #

showSmall a → String #

showList ∷ [Small a] → ShowS #

Eq a ⇒ Eq (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)Small a → Small a → Bool #

(/=)Small a → Small a → Bool #

Ord a ⇒ Ord (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compareSmall a → Small a → Ordering #

(<)Small a → Small a → Bool #

(<=)Small a → Small a → Bool #

(>)Small a → Small a → Bool #

(>=)Small a → Small a → Bool #

maxSmall a → Small a → Small a #

minSmall a → Small a → Small a #

newtype Large a Source #

Large x: by default, QuickCheck generates Ints drawn from a small range. Large Int gives you values drawn from the entire range instead.

Constructors

Large 

Fields

Instances

Instances details
Functor Large 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Large a → Large b #

(<$) ∷ a → Large b → Large a #

(Integral a, Bounded a) ⇒ Arbitrary (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Large a) Source #

shrinkLarge a → [Large a] Source #

Enum a ⇒ Enum (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succLarge a → Large a #

predLarge a → Large a #

toEnumIntLarge a #

fromEnumLarge a → Int #

enumFromLarge a → [Large a] #

enumFromThenLarge a → Large a → [Large a] #

enumFromToLarge a → Large a → [Large a] #

enumFromThenToLarge a → Large a → Large a → [Large a] #

Ix a ⇒ Ix (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

range ∷ (Large a, Large a) → [Large a] #

index ∷ (Large a, Large a) → Large a → Int #

unsafeIndex ∷ (Large a, Large a) → Large a → Int #

inRange ∷ (Large a, Large a) → Large a → Bool #

rangeSize ∷ (Large a, Large a) → Int #

unsafeRangeSize ∷ (Large a, Large a) → Int #

Num a ⇒ Num (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+)Large a → Large a → Large a #

(-)Large a → Large a → Large a #

(*)Large a → Large a → Large a #

negateLarge a → Large a #

absLarge a → Large a #

signumLarge a → Large a #

fromIntegerIntegerLarge a #

Read a ⇒ Read (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Integral a ⇒ Integral (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quotLarge a → Large a → Large a #

remLarge a → Large a → Large a #

divLarge a → Large a → Large a #

modLarge a → Large a → Large a #

quotRemLarge a → Large a → (Large a, Large a) #

divModLarge a → Large a → (Large a, Large a) #

toIntegerLarge a → Integer #

Real a ⇒ Real (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRationalLarge a → Rational #

Show a ⇒ Show (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntLarge a → ShowS #

showLarge a → String #

showList ∷ [Large a] → ShowS #

Eq a ⇒ Eq (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)Large a → Large a → Bool #

(/=)Large a → Large a → Bool #

Ord a ⇒ Ord (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compareLarge a → Large a → Ordering #

(<)Large a → Large a → Bool #

(<=)Large a → Large a → Bool #

(>)Large a → Large a → Bool #

(>=)Large a → Large a → Bool #

maxLarge a → Large a → Large a #

minLarge a → Large a → Large a #

newtype NonPositive a Source #

NonPositive x: guarantees that x <= 0.

Constructors

NonPositive 

Fields

Instances

Instances details
Functor NonPositive 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → NonPositive a → NonPositive b #

(<$) ∷ a → NonPositive b → NonPositive a #

(Num a, Ord a, Arbitrary a) ⇒ Arbitrary (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a ⇒ Enum (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a ⇒ Read (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntNonPositive a → ShowS #

showNonPositive a → String #

showList ∷ [NonPositive a] → ShowS #

Eq a ⇒ Eq (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)NonPositive a → NonPositive a → Bool #

(/=)NonPositive a → NonPositive a → Bool #

Ord a ⇒ Ord (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

newtype NonNegative a Source #

NonNegative x: guarantees that x >= 0.

Constructors

NonNegative 

Fields

Instances

Instances details
Functor NonNegative 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → NonNegative a → NonNegative b #

(<$) ∷ a → NonNegative b → NonNegative a #

(Num a, Ord a, Arbitrary a) ⇒ Arbitrary (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a ⇒ Enum (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a ⇒ Read (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntNonNegative a → ShowS #

showNonNegative a → String #

showList ∷ [NonNegative a] → ShowS #

Eq a ⇒ Eq (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)NonNegative a → NonNegative a → Bool #

(/=)NonNegative a → NonNegative a → Bool #

Ord a ⇒ Ord (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

newtype NonZero a Source #

NonZero x: guarantees that x /= 0.

Constructors

NonZero 

Fields

Instances

Instances details
Functor NonZero 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → NonZero a → NonZero b #

(<$) ∷ a → NonZero b → NonZero a #

(Num a, Eq a, Arbitrary a) ⇒ Arbitrary (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (NonZero a) Source #

shrinkNonZero a → [NonZero a] Source #

Enum a ⇒ Enum (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succNonZero a → NonZero a #

predNonZero a → NonZero a #

toEnumIntNonZero a #

fromEnumNonZero a → Int #

enumFromNonZero a → [NonZero a] #

enumFromThenNonZero a → NonZero a → [NonZero a] #

enumFromToNonZero a → NonZero a → [NonZero a] #

enumFromThenToNonZero a → NonZero a → NonZero a → [NonZero a] #

Read a ⇒ Read (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntNonZero a → ShowS #

showNonZero a → String #

showList ∷ [NonZero a] → ShowS #

Eq a ⇒ Eq (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)NonZero a → NonZero a → Bool #

(/=)NonZero a → NonZero a → Bool #

Ord a ⇒ Ord (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compareNonZero a → NonZero a → Ordering #

(<)NonZero a → NonZero a → Bool #

(<=)NonZero a → NonZero a → Bool #

(>)NonZero a → NonZero a → Bool #

(>=)NonZero a → NonZero a → Bool #

maxNonZero a → NonZero a → NonZero a #

minNonZero a → NonZero a → NonZero a #

newtype Negative a Source #

Negative x: guarantees that x < 0.

Constructors

Negative 

Fields

Instances

Instances details
Functor Negative 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Negative a → Negative b #

(<$) ∷ a → Negative b → Negative a #

(Num a, Ord a, Arbitrary a) ⇒ Arbitrary (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a ⇒ Enum (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succNegative a → Negative a #

predNegative a → Negative a #

toEnumIntNegative a #

fromEnumNegative a → Int #

enumFromNegative a → [Negative a] #

enumFromThenNegative a → Negative a → [Negative a] #

enumFromToNegative a → Negative a → [Negative a] #

enumFromThenToNegative a → Negative a → Negative a → [Negative a] #

Read a ⇒ Read (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntNegative a → ShowS #

showNegative a → String #

showList ∷ [Negative a] → ShowS #

Eq a ⇒ Eq (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)Negative a → Negative a → Bool #

(/=)Negative a → Negative a → Bool #

Ord a ⇒ Ord (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compareNegative a → Negative a → Ordering #

(<)Negative a → Negative a → Bool #

(<=)Negative a → Negative a → Bool #

(>)Negative a → Negative a → Bool #

(>=)Negative a → Negative a → Bool #

maxNegative a → Negative a → Negative a #

minNegative a → Negative a → Negative a #

newtype Positive a Source #

Positive x: guarantees that x > 0.

Constructors

Positive 

Fields

Instances

Instances details
Functor Positive 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Positive a → Positive b #

(<$) ∷ a → Positive b → Positive a #

(Num a, Ord a, Arbitrary a) ⇒ Arbitrary (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a ⇒ Enum (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succPositive a → Positive a #

predPositive a → Positive a #

toEnumIntPositive a #

fromEnumPositive a → Int #

enumFromPositive a → [Positive a] #

enumFromThenPositive a → Positive a → [Positive a] #

enumFromToPositive a → Positive a → [Positive a] #

enumFromThenToPositive a → Positive a → Positive a → [Positive a] #

Read a ⇒ Read (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntPositive a → ShowS #

showPositive a → String #

showList ∷ [Positive a] → ShowS #

Eq a ⇒ Eq (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)Positive a → Positive a → Bool #

(/=)Positive a → Positive a → Bool #

Ord a ⇒ Ord (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

comparePositive a → Positive a → Ordering #

(<)Positive a → Positive a → Bool #

(<=)Positive a → Positive a → Bool #

(>)Positive a → Positive a → Bool #

(>=)Positive a → Positive a → Bool #

maxPositive a → Positive a → Positive a #

minPositive a → Positive a → Positive a #

newtype SortedList a Source #

Sorted xs: guarantees that xs is sorted.

Constructors

Sorted 

Fields

Instances

Instances details
Functor SortedList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → SortedList a → SortedList b #

(<$) ∷ a → SortedList b → SortedList a #

(Arbitrary a, Ord a) ⇒ Arbitrary (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a ⇒ Read (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntSortedList a → ShowS #

showSortedList a → String #

showList ∷ [SortedList a] → ShowS #

Eq a ⇒ Eq (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)SortedList a → SortedList a → Bool #

(/=)SortedList a → SortedList a → Bool #

Ord a ⇒ Ord (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compareSortedList a → SortedList a → Ordering #

(<)SortedList a → SortedList a → Bool #

(<=)SortedList a → SortedList a → Bool #

(>)SortedList a → SortedList a → Bool #

(>=)SortedList a → SortedList a → Bool #

maxSortedList a → SortedList a → SortedList a #

minSortedList a → SortedList a → SortedList a #

data InfiniteList a Source #

InfiniteList xs _: guarantees that xs is an infinite list. When a counterexample is found, only prints the prefix of xs that was used by the program.

Here is a contrived example property:

prop_take_10 :: InfiniteList Char -> Bool
prop_take_10 (InfiniteList xs _) =
  or [ x == 'a' | x <- take 10 xs ]

In the following counterexample, the list must start with "bbbbbbbbbb" but the remaining (infinite) part can contain anything:

>>> quickCheck prop_take_10
*** Failed! Falsified (after 1 test and 14 shrinks):
"bbbbbbbbbb" ++ ...

Constructors

InfiniteList 

Fields

Instances

Instances details
Arbitrary a ⇒ Arbitrary (InfiniteList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (InfiniteList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntInfiniteList a → ShowS #

showInfiniteList a → String #

showList ∷ [InfiniteList a] → ShowS #

newtype OrderedList a Source #

Ordered xs: guarantees that xs is ordered.

Constructors

Ordered 

Fields

Instances

Instances details
Functor OrderedList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → OrderedList a → OrderedList b #

(<$) ∷ a → OrderedList b → OrderedList a #

(Ord a, Arbitrary a) ⇒ Arbitrary (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a ⇒ Read (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a ⇒ Show (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntOrderedList a → ShowS #

showOrderedList a → String #

showList ∷ [OrderedList a] → ShowS #

Eq a ⇒ Eq (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)OrderedList a → OrderedList a → Bool #

(/=)OrderedList a → OrderedList a → Bool #

Ord a ⇒ Ord (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

newtype Fixed a Source #

Fixed x: as x, but will not be shrunk.

Constructors

Fixed 

Fields

Instances

Instances details
Functor Fixed 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Fixed a → Fixed b #

(<$) ∷ a → Fixed b → Fixed a #

Arbitrary a ⇒ Arbitrary (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Fixed a) Source #

shrinkFixed a → [Fixed a] Source #

Enum a ⇒ Enum (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succFixed a → Fixed a #

predFixed a → Fixed a #

toEnumIntFixed a #

fromEnumFixed a → Int #

enumFromFixed a → [Fixed a] #

enumFromThenFixed a → Fixed a → [Fixed a] #

enumFromToFixed a → Fixed a → [Fixed a] #

enumFromThenToFixed a → Fixed a → Fixed a → [Fixed a] #

Num a ⇒ Num (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+)Fixed a → Fixed a → Fixed a #

(-)Fixed a → Fixed a → Fixed a #

(*)Fixed a → Fixed a → Fixed a #

negateFixed a → Fixed a #

absFixed a → Fixed a #

signumFixed a → Fixed a #

fromIntegerIntegerFixed a #

Read a ⇒ Read (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Integral a ⇒ Integral (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quotFixed a → Fixed a → Fixed a #

remFixed a → Fixed a → Fixed a #

divFixed a → Fixed a → Fixed a #

modFixed a → Fixed a → Fixed a #

quotRemFixed a → Fixed a → (Fixed a, Fixed a) #

divModFixed a → Fixed a → (Fixed a, Fixed a) #

toIntegerFixed a → Integer #

Real a ⇒ Real (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRationalFixed a → Rational #

Show a ⇒ Show (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntFixed a → ShowS #

showFixed a → String #

showList ∷ [Fixed a] → ShowS #

Eq a ⇒ Eq (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)Fixed a → Fixed a → Bool #

(/=)Fixed a → Fixed a → Bool #

Ord a ⇒ Ord (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compareFixed a → Fixed a → Ordering #

(<)Fixed a → Fixed a → Bool #

(<=)Fixed a → Fixed a → Bool #

(>)Fixed a → Fixed a → Bool #

(>=)Fixed a → Fixed a → Bool #

maxFixed a → Fixed a → Fixed a #

minFixed a → Fixed a → Fixed a #

newtype Blind a Source #

Blind x: as x, but x does not have to be in the Show class.

Constructors

Blind 

Fields

Instances

Instances details
Functor Blind 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap ∷ (a → b) → Blind a → Blind b #

(<$) ∷ a → Blind b → Blind a #

Arbitrary a ⇒ Arbitrary (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitraryGen (Blind a) Source #

shrinkBlind a → [Blind a] Source #

Enum a ⇒ Enum (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succBlind a → Blind a #

predBlind a → Blind a #

toEnumIntBlind a #

fromEnumBlind a → Int #

enumFromBlind a → [Blind a] #

enumFromThenBlind a → Blind a → [Blind a] #

enumFromToBlind a → Blind a → [Blind a] #

enumFromThenToBlind a → Blind a → Blind a → [Blind a] #

Num a ⇒ Num (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+)Blind a → Blind a → Blind a #

(-)Blind a → Blind a → Blind a #

(*)Blind a → Blind a → Blind a #

negateBlind a → Blind a #

absBlind a → Blind a #

signumBlind a → Blind a #

fromIntegerIntegerBlind a #

Integral a ⇒ Integral (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quotBlind a → Blind a → Blind a #

remBlind a → Blind a → Blind a #

divBlind a → Blind a → Blind a #

modBlind a → Blind a → Blind a #

quotRemBlind a → Blind a → (Blind a, Blind a) #

divModBlind a → Blind a → (Blind a, Blind a) #

toIntegerBlind a → Integer #

Real a ⇒ Real (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRationalBlind a → Rational #

Show (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrecIntBlind a → ShowS #

showBlind a → String #

showList ∷ [Blind a] → ShowS #

Eq a ⇒ Eq (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==)Blind a → Blind a → Bool #

(/=)Blind a → Blind a → Bool #

Ord a ⇒ Ord (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compareBlind a → Blind a → Ordering #

(<)Blind a → Blind a → Bool #

(<=)Blind a → Blind a → Bool #

(>)Blind a → Blind a → Bool #

(>=)Blind a → Blind a → Bool #

maxBlind a → Blind a → Blind a #

minBlind a → Blind a → Blind a #

class Function a where Source #

The class Function a is used for random generation of showable functions of type a -> b.

There is a default implementation for function, which you can use if your type has structural equality. Otherwise, you can normally use functionMap or functionShow.

Minimal complete definition

Nothing

Methods

function ∷ (a → b) → a :-> b Source #

default function ∷ (Generic a, GFunction (Rep a)) ⇒ (a → b) → a :-> b Source #

Instances

Instances details
Function A 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (A → b) → A :-> b Source #

Function B 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (B → b) → B :-> b Source #

Function C 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (C → b) → C :-> b Source #

Function OrdA 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (OrdA → b) → OrdA :-> b Source #

Function OrdB 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (OrdB → b) → OrdB :-> b Source #

Function OrdC 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (OrdC → b) → OrdC :-> b Source #

Function Key

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.Key

Methods

function ∷ (Key → b) → Key :-> b Source #

Function Value

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.Types.Internal

Methods

function ∷ (Value → b) → Value :-> b Source #

Function ByteArray

Since: quickcheck-instances-0.3.28

Instance details

Defined in Test.QuickCheck.Instances.Primitive

Methods

function ∷ (ByteArray → b) → ByteArray :-> b Source #

Function ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Methods

function ∷ (ByteString64 → b) → ByteString64 :-> b Source #

Function ByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Methods

function ∷ (ByteString → b) → ByteString :-> b Source #

Function ByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Methods

function ∷ (ByteString → b) → ByteString :-> b Source #

Function ShortByteString 
Instance details

Defined in Test.QuickCheck.Instances.ByteString

Function IntSet 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (IntSet → b) → IntSet :-> b Source #

Function Void

All Void -> a functions are absurd.

Instance details

Defined in Test.QuickCheck.Instances.Void

Methods

function ∷ (Void → b) → Void :-> b Source #

Function All 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (All → b) → All :-> b Source #

Function Any 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Any → b) → Any :-> b Source #

Function Newline 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Newline → b) → Newline :-> b Source #

Function NewlineMode 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (NewlineMode → b) → NewlineMode :-> b Source #

Function Int16 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Int16 → b) → Int16 :-> b Source #

Function Int32 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Int32 → b) → Int32 :-> b Source #

Function Int64 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Int64 → b) → Int64 :-> b Source #

Function Int8 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Int8 → b) → Int8 :-> b Source #

Function Word16 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Word16 → b) → Word16 :-> b Source #

Function Word32 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Word32 → b) → Word32 :-> b Source #

Function Word64 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Word64 → b) → Word64 :-> b Source #

Function Word8 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Word8 → b) → Word8 :-> b Source #

Function Ordering 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Ordering → b) → Ordering :-> b Source #

Function Scientific 
Instance details

Defined in Test.QuickCheck.Instances.Scientific

Methods

function ∷ (Scientific → b) → Scientific :-> b Source #

Function Text 
Instance details

Defined in Test.QuickCheck.Instances.Text

Methods

function ∷ (Text → b) → Text :-> b Source #

Function Text 
Instance details

Defined in Test.QuickCheck.Instances.Text

Methods

function ∷ (Text → b) → Text :-> b Source #

Function ShortText 
Instance details

Defined in Test.QuickCheck.Instances.Text.Short

Methods

function ∷ (ShortText → b) → ShortText :-> b Source #

Function CalendarDiffDays 
Instance details

Defined in Test.QuickCheck.Instances.Time

Function Day 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

function ∷ (Day → b) → Day :-> b Source #

Function Month 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

function ∷ (Month → b) → Month :-> b Source #

Function Quarter 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

function ∷ (Quarter → b) → Quarter :-> b Source #

Function QuarterOfYear 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

function ∷ (QuarterOfYear → b) → QuarterOfYear :-> b Source #

Function DayOfWeek 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

function ∷ (DayOfWeek → b) → DayOfWeek :-> b Source #

Function DiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

function ∷ (DiffTime → b) → DiffTime :-> b Source #

Function NominalDiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Function SystemTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

function ∷ (SystemTime → b) → SystemTime :-> b Source #

Function UTCTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Methods

function ∷ (UTCTime → b) → UTCTime :-> b Source #

Function CalendarDiffTime 
Instance details

Defined in Test.QuickCheck.Instances.Time

Function UUID 
Instance details

Defined in Test.QuickCheck.Instances.UUID

Methods

function ∷ (UUID → b) → UUID :-> b Source #

Function Integer 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Integer → b) → Integer :-> b Source #

Function Natural 
Instance details

Defined in Test.QuickCheck.Instances.Natural

Methods

function ∷ (Natural → b) → Natural :-> b Source #

Function () 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (() → b) → () :-> b Source #

Function Bool 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Bool → b) → Bool :-> b Source #

Function Char 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Char → b) → Char :-> b Source #

Function Double 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Double → b) → Double :-> b Source #

Function Float 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Float → b) → Float :-> b Source #

Function Int 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Int → b) → Int :-> b Source #

Function Word 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Word → b) → Word :-> b Source #

Function v ⇒ Function (KeyMap v)

Since: aeson-2.0.3.0

Instance details

Defined in Data.Aeson.KeyMap

Methods

function ∷ (KeyMap v → b) → KeyMap v :-> b Source #

(RealFloat a, Function a) ⇒ Function (Complex a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Complex a → b) → Complex a :-> b Source #

Function a ⇒ Function (First a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

function ∷ (First a → b) → First a :-> b Source #

Function a ⇒ Function (Last a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

function ∷ (Last a → b) → Last a :-> b Source #

Function a ⇒ Function (Max a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

function ∷ (Max a → b) → Max a :-> b Source #

Function a ⇒ Function (Min a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

function ∷ (Min a → b) → Min a :-> b Source #

Function a ⇒ Function (WrappedMonoid a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

function ∷ (WrappedMonoid a → b) → WrappedMonoid a :-> b Source #

(FoldCase a, Function a) ⇒ Function (CI a) 
Instance details

Defined in Test.QuickCheck.Instances.CaseInsensitive

Methods

function ∷ (CI a → b) → CI a :-> b Source #

Function a ⇒ Function (IntMap a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (IntMap a → b) → IntMap a :-> b Source #

Function a ⇒ Function (Seq a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Seq a → b) → Seq a :-> b Source #

(Ord a, Function a) ⇒ Function (Set a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Set a → b) → Set a :-> b Source #

Function a ⇒ Function (Tree a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Tree a → b) → Tree a :-> b Source #

Function a ⇒ Function (NonEmpty a) 
Instance details

Defined in Test.QuickCheck.Instances.Semigroup

Methods

function ∷ (NonEmpty a → b) → NonEmpty a :-> b Source #

Function a ⇒ Function (Identity a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Identity a → b) → Identity a :-> b Source #

Function a ⇒ Function (First a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (First a → b) → First a :-> b Source #

Function a ⇒ Function (Last a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Last a → b) → Last a :-> b Source #

Function a ⇒ Function (Dual a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Dual a → b) → Dual a :-> b Source #

Function a ⇒ Function (Product a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Product a → b) → Product a :-> b Source #

Function a ⇒ Function (Sum a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Sum a → b) → Sum a :-> b Source #

(Integral a, Function a) ⇒ Function (Ratio a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Ratio a → b) → Ratio a :-> b Source #

Function a ⇒ Function (Maybe a)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

function ∷ (Maybe a → b) → Maybe a :-> b Source #

(Hashable a, Eq a, Function a) ⇒ Function (HashSet a) 
Instance details

Defined in Test.QuickCheck.Instances.UnorderedContainers

Methods

function ∷ (HashSet a → b) → HashSet a :-> b Source #

Function a ⇒ Function (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

function ∷ (Vector a → b) → Vector a :-> b Source #

(Prim a, Function a) ⇒ Function (Vector a)

Since: quickcheck-instances-0.3.32

Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

function ∷ (Vector a → b) → Vector a :-> b Source #

(Storable a, Function a) ⇒ Function (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

function ∷ (Vector a → b) → Vector a :-> b Source #

Function a ⇒ Function (Vector a)

Since: quickcheck-instances-0.3.33

Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

function ∷ (Vector a → b) → Vector a :-> b Source #

(Unbox a, Function a) ⇒ Function (Vector a) 
Instance details

Defined in Test.QuickCheck.Instances.Vector

Methods

function ∷ (Vector a → b) → Vector a :-> b Source #

Function a ⇒ Function (Maybe a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Maybe a → b) → Maybe a :-> b Source #

Function a ⇒ Function (Solo a) 
Instance details

Defined in Test.QuickCheck.Instances.Solo

Methods

function ∷ (Solo a → b) → Solo a :-> b Source #

Function a ⇒ Function [a] 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ ([a] → b) → [a] :-> b Source #

HasResolution a ⇒ Function (Fixed a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Fixed a → b) → Fixed a :-> b Source #

(Ord a, Function a, Function b) ⇒ Function (Map a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Map a b → b0) → Map a b :-> b0 Source #

(Function a, Function b) ⇒ Function (Either a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Either a b → b0) → Either a b :-> b0 Source #

Function (Proxy a) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

function ∷ (Proxy a → b) → Proxy a :-> b Source #

(Function a, Function b) ⇒ Function (Either a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

function ∷ (Either a b → b0) → Either a b :-> b0 Source #

(Function a, Function b) ⇒ Function (These a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

function ∷ (These a b → b0) → These a b :-> b0 Source #

(Function a, Function b) ⇒ Function (Pair a b)

Since: quickcheck-instances-0.3.24

Instance details

Defined in Test.QuickCheck.Instances.Strict

Methods

function ∷ (Pair a b → b0) → Pair a b :-> b0 Source #

(Function a, Function b) ⇒ Function (These a b)

Since: quickcheck-instances-0.3.23

Instance details

Defined in Test.QuickCheck.Instances.These

Methods

function ∷ (These a b → b0) → These a b :-> b0 Source #

(Hashable k, Eq k, Function k, Function v) ⇒ Function (HashMap k v) 
Instance details

Defined in Test.QuickCheck.Instances.UnorderedContainers

Methods

function ∷ (HashMap k v → b) → HashMap k v :-> b Source #

(Function a, Function b) ⇒ Function (a, b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ ((a, b) → b0) → (a, b) :-> b0 Source #

Function a ⇒ Function (Const a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Const a b → b0) → Const a b :-> b0 Source #

Function (f a) ⇒ Function (Alt f a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ (Alt f a → b) → Alt f a :-> b Source #

Function b ⇒ Function (Tagged a b) 
Instance details

Defined in Test.QuickCheck.Instances.Tagged

Methods

function ∷ (Tagged a b → b0) → Tagged a b :-> b0 Source #

(Function a, Function b, Function c) ⇒ Function (a, b, c) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ ((a, b, c) → b0) → (a, b, c) :-> b0 Source #

(Function a, Function b, Function c, Function d) ⇒ Function (a, b, c, d) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ ((a, b, c, d) → b0) → (a, b, c, d) :-> b0 Source #

(Function a, Function b, Function c, Function d, Function e) ⇒ Function (a, b, c, d, e) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ ((a, b, c, d, e) → b0) → (a, b, c, d, e) :-> b0 Source #

(Function a, Function b, Function c, Function d, Function e, Function f) ⇒ Function (a, b, c, d, e, f) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ ((a, b, c, d, e, f) → b0) → (a, b, c, d, e, f) :-> b0 Source #

(Function a, Function b, Function c, Function d, Function e, Function f, Function g) ⇒ Function (a, b, c, d, e, f, g) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function ∷ ((a, b, c, d, e, f, g) → b0) → (a, b, c, d, e, f, g) :-> b0 Source #

pattern Fn3 ∷ (a → b → c → d) → Fun (a, b, c) d Source #

A modifier for testing ternary functions.

pattern Fn2 ∷ (a → b → c) → Fun (a, b) c Source #

A modifier for testing binary functions.

prop_zipWith :: Fun (Int, Bool) Char -> [Int] -> [Bool] -> Bool
prop_zipWith (Fn2 f) xs ys = zipWith f xs ys == [ f x y | (x, y) <- zip xs ys]

pattern Fn ∷ (a → b) → Fun a b Source #

A modifier for testing functions.

prop :: Fun String Integer -> Bool
prop (Fn f) = f "banana" == f "monkey"
           || f "banana" == f "elephant"

functionBoundedEnum ∷ (Eq a, Bounded a, Enum a) ⇒ (a → b) → a :-> b Source #

Provides a Function instance for types with Bounded and Enum. Use only for small types (i.e. not integers): creates the list [minBound..maxBound]!

functionRealFracRealFrac a ⇒ (a → b) → a :-> b Source #

Provides a Function instance for types with RealFrac.

functionIntegralIntegral a ⇒ (a → b) → a :-> b Source #

Provides a Function instance for types with Integral.

functionShow ∷ (Show a, Read a) ⇒ (a → c) → a :-> c Source #

Provides a Function instance for types with Show and Read.

functionVoid ∷ (∀ b. void → b) → void :-> c Source #

Provides a Function instance for types isomorphic to Void.

An actual Function Void instance is defined in quickcheck-instances.

functionMapFunction b ⇒ (a → b) → (b → a) → (a → c) → a :-> c Source #

The basic building block for Function instances. Provides a Function instance by mapping to and from a type that already has a Function instance.

applyFunFun a b → a → b Source #

Extracts the value of a function.

Fn is the pattern equivalent of this function.

prop :: Fun String Integer -> Bool
prop f = applyFun f "banana" == applyFun f "monkey"
      || applyFun f "banana" == applyFun f "elephant"

applyFun2Fun (a, b) c → a → b → c Source #

Extracts the value of a binary function.

Fn2 is the pattern equivalent of this function.

prop_zipWith :: Fun (Int, Bool) Char -> [Int] -> [Bool] -> Bool
prop_zipWith f xs ys = zipWith (applyFun2 f) xs ys == [ applyFun2 f x y | (x, y) <- zip xs ys]

applyFun3Fun (a, b, c) d → a → b → c → d Source #

Extracts the value of a ternary function. Fn3 is the pattern equivalent of this function.

data Confidence Source #

The statistical parameters used by checkCoverage.

Constructors

Confidence 

Fields

  • certaintyInteger

    How certain checkCoverage must be before the property fails. If the coverage requirement is met, and the certainty parameter is n, then you should get a false positive at most one in n runs of QuickCheck. The default value is 10^9.

    Lower values will speed up checkCoverage at the cost of false positives.

    If you are using checkCoverage as part of a test suite, you should be careful not to set certainty too low. If you want, say, a 1% chance of a false positive during a project's lifetime, then certainty should be set to at least 100 * m * n, where m is the number of uses of cover in the test suite, and n is the number of times you expect the test suite to be run during the project's lifetime. The default value is chosen to be big enough for most projects.

  • toleranceDouble

    For statistical reasons, checkCoverage will not reject coverage levels that are only slightly below the required levels. If the required level is p then an actual level of tolerance * p will be accepted. The default value is 0.9.

    Lower values will speed up checkCoverage at the cost of not detecting minor coverage violations.

Instances

Instances details
Show Confidence 
Instance details

Defined in Test.QuickCheck.State

pattern Wit ∷ () ⇒ (Typeable a, Show a) ⇒ a → Witness Source #

data Discard Source #

If a property returns Discard, the current test case is discarded, the same as if a precondition was false.

An example is the definition of ==>:

(==>) :: Testable prop => Bool -> prop -> Property
False ==> _ = property Discard
True  ==> p = property p

Constructors

Discard 

Instances

Instances details
Testable Discard 
Instance details

Defined in Test.QuickCheck.Property

Methods

propertyDiscardProperty Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Discard) → Property Source #

data Property Source #

The type of properties.

Instances

Instances details
Testable Property 
Instance details

Defined in Test.QuickCheck.Property

Methods

propertyPropertyProperty Source #

propertyForAllShrinkShowGen a → (a → [a]) → (a → [String]) → (a → Property) → Property Source #

Example Property 
Instance details

Defined in Test.Hspec.Core.QuickCheck

Associated Types

type Arg Property 
Instance details

Defined in Test.Hspec.Core.QuickCheck

type Arg Property = ()
Example (a → Property) 
Instance details

Defined in Test.Hspec.Core.QuickCheck

Associated Types

type Arg (a → Property) 
Instance details

Defined in Test.Hspec.Core.QuickCheck

type Arg (a → Property) = a

Methods

evaluateExample ∷ (a → Property) → Params → (ActionWith (Arg (a → Property)) → IO ()) → ProgressCallbackIO Result Source #

type Arg Property 
Instance details

Defined in Test.Hspec.Core.QuickCheck

type Arg Property = ()
type Arg (a → Property) 
Instance details

Defined in Test.Hspec.Core.QuickCheck

type Arg (a → Property) = a

ioPropertyTestable prop ⇒ IO prop → Property Source #

Do I/O inside a property.

Warning: any random values generated inside of the argument to ioProperty will not currently be shrunk. For best results, generate all random values before calling ioProperty, or use idempotentIOProperty if that is safe.

idempotentIOPropertyTestable prop ⇒ IO prop → Property Source #

Do I/O inside a property.

Warning: during shrinking, the I/O may not always be re-executed. Instead, the I/O may be executed once and then its result retained. If this is not acceptable, use ioProperty instead.

mapSizeTestable prop ⇒ (IntInt) → prop → Property Source #

Adjust the test case size for a property, by transforming it with the given function.

shrinking Source #

Arguments

Testable prop 
⇒ (a → [a])

shrink-like function.

→ a

The original argument

→ (a → prop) 
Property 

Shrinks the argument to a property if it fails. Shrinking is done automatically for most types. This function is only needed when you want to override the default behavior.

noShrinkingTestable prop ⇒ prop → Property Source #

Disables shrinking for a property altogether. Only quantification inside the call to noShrinking is affected.

counterexampleTestable prop ⇒ String → prop → Property Source #

Adds the given string to the counterexample if the property fails.

printTestCaseTestable prop ⇒ String → prop → Property Source #

Adds the given string to the counterexample if the property fails.

whenFailTestable prop ⇒ IO () → prop → Property Source #

Performs an IO action after the last failure of a property.

whenFail'Testable prop ⇒ IO () → prop → Property Source #

Performs an IO action every time a property fails. Thus, if shrinking is done, this can be used to keep track of the failures along the way.

verboseTestable prop ⇒ prop → Property Source #

Prints out the generated test case every time the property is tested. Only variables quantified over inside the verbose are printed.

Note: for technical reasons, the test case is printed out after the property is tested. To debug a property that goes into an infinite loop, use within to add a timeout instead.

verboseShrinkingTestable prop ⇒ prop → Property Source #

Prints out the generated test case every time the property fails, including during shrinking. Only variables quantified over inside the verboseShrinking are printed.

Note: for technical reasons, the test case is printed out after the property is tested. To debug a property that goes into an infinite loop, use within to add a timeout instead.

expectFailureTestable prop ⇒ prop → Property Source #

Indicates that a property is supposed to fail. QuickCheck will report an error if it does not fail.

onceTestable prop ⇒ prop → Property Source #

Modifies a property so that it only will be tested once. Opposite of again.

againTestable prop ⇒ prop → Property Source #

Modifies a property so that it will be tested repeatedly. Opposite of once.

withMaxSuccessTestable prop ⇒ Int → prop → Property Source #

Configures how many times a property will be tested.

For example,

quickCheck (withMaxSuccess 1000 p)

will test p up to 1000 times.

withDiscardRatioTestable prop ⇒ Int → prop → Property Source #

Configures how many times a property is allowed to be discarded before failing.

For example,

quickCheck (withDiscardRatio 10 p)

will allow p to fail up to 10 times per successful test.

withMaxShrinksTestable prop ⇒ Int → prop → Property Source #

Configure the maximum number of times a property will be shrunk.

For example,

quickCheck (withMaxShrinks 100 p)

will cause p to only attempt 100 shrinks on failure.

withMaxSizeTestable prop ⇒ Int → prop → Property Source #

Configure the maximum size a property will be tested at.

witness ∷ (Typeable a, Show a, Testable prop) ⇒ a → prop → Property Source #

Return a value in the witnesses field of the Result returned by quickCheckResult. Witnesses are returned outer-most first.

In ghci, for example:

>>> [Wit x] <- fmap witnesses . quickCheckResult $ \ x -> witness x $ x == (0 :: Int)
*** Failed! Falsified (after 2 tests):
1
>>> x
1
>>> :t x
x :: Int

checkCoverageTestable prop ⇒ prop → Property Source #

Check that all coverage requirements defined by cover and coverTable are met, using a statistically sound test, and fail if they are not met.

Ordinarily, a failed coverage check does not cause the property to fail. This is because the coverage requirement is not tested in a statistically sound way. If you use cover to express that a certain value must appear 20% of the time, QuickCheck will warn you if the value only appears in 19 out of 100 test cases - but since the coverage varies randomly, you may have just been unlucky, and there may not be any real problem with your test generation.

When you use checkCoverage, QuickCheck uses a statistical test to account for the role of luck in coverage failures. It will run as many tests as needed until it is sure about whether the coverage requirements are met. If a coverage requirement is not met, the property fails.

Example:

quickCheck (checkCoverage prop_foo)

checkCoverageWithTestable prop ⇒ Confidence → prop → Property Source #

Check coverage requirements using a custom confidence level. See stdConfidence.

An example of making the statistical test less stringent in order to improve performance:

quickCheck (checkCoverageWith stdConfidence{certainty = 10^6} prop_foo)

stdConfidenceConfidence Source #

The standard parameters used by checkCoverage: certainty = 10^9, tolerance = 0.9. See Confidence for the meaning of the parameters.

labelTestable prop ⇒ String → prop → Property Source #

Attaches a label to a test case. This is used for reporting test case distribution.

For example:

prop_reverse_reverse :: [Int] -> Property
prop_reverse_reverse xs =
  label ("length of input is " ++ show (length xs)) $
    reverse (reverse xs) === xs
>>> quickCheck prop_reverse_reverse
+++ OK, passed 100 tests:
7% length of input is 7
6% length of input is 3
5% length of input is 4
4% length of input is 6
...

Each use of label in your property results in a separate table of test case distribution in the output. If this is not what you want, use tabulate.

collect ∷ (Show a, Testable prop) ⇒ a → prop → Property Source #

Attaches a label to a test case. This is used for reporting test case distribution.

collect x = label (show x)

For example:

prop_reverse_reverse :: [Int] -> Property
prop_reverse_reverse xs =
  collect (length xs) $
    reverse (reverse xs) === xs
>>> quickCheck prop_reverse_reverse
+++ OK, passed 100 tests:
7% 7
6% 3
5% 4
4% 6
...

Each use of collect in your property results in a separate table of test case distribution in the output. If this is not what you want, use tabulate.

classify Source #

Arguments

Testable prop 
Bool

True if the test case should be labelled.

String

Label.

→ prop 
Property 

Reports how many test cases satisfy a given condition.

For example:

prop_sorted_sort :: [Int] -> Property
prop_sorted_sort xs =
  sorted xs ==>
  classify (length xs > 1) "non-trivial" $
  sort xs === xs
>>> quickCheck prop_sorted_sort
+++ OK, passed 100 tests (22% non-trivial).

cover Source #

Arguments

Testable prop 
Double

The required percentage (0-100) of test cases.

Bool

True if the test case belongs to the class.

String

Label for the test case class.

→ prop 
Property 

Checks that at least the given proportion of successful test cases belong to the given class. Discarded tests (i.e. ones with a false precondition) do not affect coverage.

Note: If the coverage check fails, QuickCheck prints out a warning, but the property does not fail. To make the property fail, use checkCoverage.

For example:

prop_sorted_sort :: [Int] -> Property
prop_sorted_sort xs =
  sorted xs ==>
  cover 50 (length xs > 1) "non-trivial" $
  sort xs === xs
>>> quickCheck prop_sorted_sort
+++ OK, passed 100 tests; 135 discarded (26% non-trivial).

Only 26% non-trivial, but expected 50%

tabulateTestable prop ⇒ String → [String] → prop → Property Source #

Collects information about test case distribution into a table. The arguments to tabulate are the table's name and a list of values associated with the current test case. After testing, QuickCheck prints the frequency of all collected values. The frequencies are expressed as a percentage of the total number of values collected.

You should prefer tabulate to label when each test case is associated with a varying number of values. Here is a (not terribly useful) example, where the test data is a list of integers and we record all values that occur in the list:

prop_sorted_sort :: [Int] -> Property
prop_sorted_sort xs =
  sorted xs ==>
  tabulate "List elements" (map show xs) $
  sort xs === xs
>>> quickCheck prop_sorted_sort
+++ OK, passed 100 tests; 1684 discarded.

List elements (109 in total):
 3.7% 0
 3.7% 17
 3.7% 2
 3.7% 6
 2.8% -6
 2.8% -7

Here is a more useful example. We are testing a chatroom, where the user can log in, log out, or send a message:

data Command = LogIn | LogOut | SendMessage String deriving (Data, Show)
instance Arbitrary Command where ...

There are some restrictions on command sequences; for example, the user must log in before doing anything else. The function valid :: [Command] -> Bool checks that a command sequence is allowed. Our property then has the form:

prop_chatroom :: [Command] -> Property
prop_chatroom cmds =
  valid cmds ==>
    ...

The use of ==> may skew test case distribution. We use collect to see the length of the command sequences, and tabulate to get the frequencies of the individual commands:

prop_chatroom :: [Command] -> Property
prop_chatroom cmds =
  wellFormed cmds LoggedOut ==>
  'collect' (length cmds) $
  'tabulate' "Commands" (map (show . 'Data.Data.toConstr') cmds) $
    ...
>>> quickCheckWith stdArgs{maxDiscardRatio = 1000} prop_chatroom
+++ OK, passed 100 tests; 2775 discarded:
60% 0
20% 1
15% 2
 3% 3
 1% 4
 1% 5

Commands (68 in total):
62% LogIn
22% SendMessage
16% LogOut

coverTableTestable prop ⇒ String → [(String, Double)] → prop → Property Source #

Checks that the values in a given table appear a certain proportion of the time. A call to coverTable table [(x1, p1), ..., (xn, pn)] asserts that of the values in table, x1 should appear at least p1 percent of the time that table appears, x2 at least p2 percent of the time that table appears, and so on.

Note: If the coverage check fails, QuickCheck prints out a warning, but the property does not fail. To make the property fail, use checkCoverage.

Continuing the example from the tabular combinator...

data Command = LogIn | LogOut | SendMessage String deriving (Data, Show)
prop_chatroom :: [Command] -> Property
prop_chatroom cmds =
  wellFormed cmds LoggedOut ==>
  'tabulate' "Commands" (map (show . 'Data.Data.toConstr') cmds) $
    ...

...we can add a coverage requirement as follows, which checks that LogIn, LogOut and SendMessage each occur at least 25% of the time:

prop_chatroom :: [Command] -> Property
prop_chatroom cmds =
  wellFormed cmds LoggedOut ==>
  coverTable "Commands" [("LogIn", 25), ("LogOut", 25), ("SendMessage", 25)] $
  'tabulate' "Commands" (map (show . 'Data.Data.toConstr') cmds) $
    ... property goes here ...
>>> quickCheck prop_chatroom
+++ OK, passed 100 tests; 2909 discarded:
56% 0
17% 1
10% 2
 6% 3
 5% 4
 3% 5
 3% 7

Commands (111 in total):
51.4% LogIn
30.6% SendMessage
18.0% LogOut

Table 'Commands' had only 18.0% LogOut, but expected 25.0%

withinTestable prop ⇒ Int → prop → Property Source #

Considers a property failed if it does not complete within the given number of microseconds.

Note: if the property times out, variables quantified inside the within will not be printed. Therefore, you should use within only in the body of your property.

Good: prop_foo a b c = within 1000000 ...

Bad: prop_foo = within 1000000 $ \a b c -> ...

Bad: prop_foo a b c = ...; main = quickCheck (within 1000000 prop_foo)

discardAfterTestable prop ⇒ Int → prop → Property Source #

Discards the test case if it does not complete within the given number of microseconds. This can be useful when testing algorithms that have pathological cases where they run extremely slowly.

forAll ∷ (Show a, Testable prop) ⇒ Gen a → (a → prop) → Property Source #

Explicit universal quantification: uses an explicitly given test case generator.

forAllShowTestable prop ⇒ Gen a → (a → String) → (a → prop) → Property Source #

Like forAll, but with an explicitly given show function.

forAllBlindTestable prop ⇒ Gen a → (a → prop) → Property Source #

Like forAll, but without printing the generated value.

forAllShrink ∷ (Show a, Testable prop) ⇒ Gen a → (a → [a]) → (a → prop) → Property Source #

Like forAll, but tries to shrink the argument for failing test cases.

forAllShrinkShowTestable prop ⇒ Gen a → (a → [a]) → (a → String) → (a → prop) → Property Source #

Like forAllShrink, but with an explicitly given show function.

forAllShrinkBlindTestable prop ⇒ Gen a → (a → [a]) → (a → prop) → Property Source #

Like forAllShrink, but without printing the generated value.

(.&.) ∷ (Testable prop1, Testable prop2) ⇒ prop1 → prop2 → Property infixr 1 Source #

Nondeterministic choice: p1 .&. p2 picks randomly one of p1 and p2 to test. If you test the property 100 times it makes 100 random choices.

(.&&.) ∷ (Testable prop1, Testable prop2) ⇒ prop1 → prop2 → Property infixr 1 Source #

Conjunction: p1 .&&. p2 passes if both p1 and p2 pass.

conjoinTestable prop ⇒ [prop] → Property Source #

Take the conjunction of several properties.

(.||.) ∷ (Testable prop1, Testable prop2) ⇒ prop1 → prop2 → Property infixr 1 Source #

Disjunction: p1 .||. p2 passes unless p1 and p2 simultaneously fail.

disjoinTestable prop ⇒ [prop] → Property Source #

Take the disjunction of several properties.

(===) ∷ (Eq a, Show a) ⇒ a → a → Property infix 4 Source #

Like ==, but prints a counterexample when it fails.

(=/=) ∷ (Eq a, Show a) ⇒ a → a → Property infix 4 Source #

Like /=, but prints a counterexample when it fails.

totalNFData a ⇒ a → Property Source #

Checks that a value is total, i.e., doesn't crash when evaluated.

data Args Source #

Args specifies arguments to the QuickCheck driver

Constructors

Args 

Fields

  • replayMaybe (QCGen, Int)

    Should we replay a previous test? Note: saving a seed from one version of QuickCheck and replaying it in another is not supported. If you want to store a test case permanently you should save the test case itself.

  • maxSuccessInt

    Maximum number of successful tests before succeeding. Testing stops at the first failure. If all tests are passing and you want to run more tests, increase this number.

  • maxDiscardRatioInt

    Maximum number of discarded tests per successful test before giving up

  • maxSizeInt

    Size to use for the biggest test cases

  • chattyBool

    Whether to print anything

  • maxShrinksInt

    Maximum number of shrinks to do before giving up. Setting this to zero turns shrinking off.

Instances

Instances details
Read Args 
Instance details

Defined in Test.QuickCheck.Test

Show Args 
Instance details

Defined in Test.QuickCheck.Test

Methods

showsPrecIntArgsShowS #

showArgsString #

showList ∷ [Args] → ShowS #

isSuccessResultBool Source #

Check if the test run result was a success

stdArgsArgs Source #

The default test arguments

quickCheckTestable prop ⇒ prop → IO () Source #

Tests a property and prints the results to stdout.

By default up to 100 tests are performed, which may not be enough to find all bugs. To run more tests, use withMaxSuccess.

If you want to get the counterexample as a Haskell value, rather than just printing it, try the quickcheck-with-counterexamples package.

quickCheckWithTestable prop ⇒ Args → prop → IO () Source #

Tests a property, using test arguments, and prints the results to stdout.

quickCheckResultTestable prop ⇒ prop → IO Result Source #

Tests a property, produces a test result, and prints the results to stdout.

quickCheckWithResultTestable prop ⇒ Args → prop → IO Result Source #

Tests a property, using test arguments, produces a test result, and prints the results to stdout.

recheckTestable prop ⇒ Result → prop → IO () Source #

Re-run a property with the seed and size that failed in a run of quickCheckResult.

verboseCheckTestable prop ⇒ prop → IO () Source #

Tests a property and prints the results and all test cases generated to stdout. This is just a convenience function that means the same as quickCheck . verbose.

Note: for technical reasons, the test case is printed out after the property is tested. To debug a property that goes into an infinite loop, use within to add a timeout instead.

verboseCheckWithTestable prop ⇒ Args → prop → IO () Source #

Tests a property, using test arguments, and prints the results and all test cases generated to stdout. This is just a convenience function that combines quickCheckWith and verbose.

Note: for technical reasons, the test case is printed out after the property is tested. To debug a property that goes into an infinite loop, use within to add a timeout instead.

verboseCheckResultTestable prop ⇒ prop → IO Result Source #

Tests a property, produces a test result, and prints the results and all test cases generated to stdout. This is just a convenience function that combines quickCheckResult and verbose.

Note: for technical reasons, the test case is printed out after the property is tested. To debug a property that goes into an infinite loop, use within to add a timeout instead.

verboseCheckWithResultTestable prop ⇒ Args → prop → IO Result Source #

Tests a property, using test arguments, produces a test result, and prints the results and all test cases generated to stdout. This is just a convenience function that combines quickCheckWithResult and verbose.

Note: for technical reasons, the test case is printed out after the property is tested. To debug a property that goes into an infinite loop, use within to add a timeout instead.

polyQuickCheckNameExpQ Source #

Test a polymorphic property, defaulting all type variables to Integer.

Invoke as $(polyQuickCheck 'prop), where prop is a property. Note that just evaluating quickCheck prop in GHCi will seem to work, but will silently default all type variables to ()!

$(polyQuickCheck 'prop) means the same as quickCheck $(monomorphic 'prop). If you want to supply custom arguments to polyQuickCheck, you will have to combine quickCheckWith and monomorphic yourself.

If you want to use polyQuickCheck in the same file where you defined the property, the same scoping problems pop up as in quickCheckAll: see the note there about return [].

polyVerboseCheckNameExpQ Source #

Test a polymorphic property, defaulting all type variables to Integer. This is just a convenience function that combines verboseCheck and monomorphic.

If you want to use polyVerboseCheck in the same file where you defined the property, the same scoping problems pop up as in quickCheckAll: see the note there about return [].

monomorphicNameExpQ Source #

Monomorphise an arbitrary property by defaulting all type variables to Integer.

For example, if f has type Ord a => [a] -> [a] then $(monomorphic 'f) has type [Integer] -> [Integer].

If you want to use monomorphic in the same file where you defined the property, the same scoping problems pop up as in quickCheckAll: see the note there about return [].

forAllPropertiesQ Exp Source #

Test all properties in the current module, using a custom quickCheck function. The same caveats as with quickCheckAll apply.

$forAllProperties has type (Property -> IO Result) -> IO Bool. An example invocation is $forAllProperties quickCheckResult, which does the same thing as $quickCheckAll.

forAllProperties has the same issue with scoping as quickCheckAll: see the note there about return [].

allPropertiesQ Exp Source #

List all properties in the current module.

$allProperties has type [(String, Property)].

allProperties has the same issue with scoping as quickCheckAll: see the note there about return [].

quickCheckAllQ Exp Source #

Test all properties in the current module. The name of the property must begin with prop_. Polymorphic properties will be defaulted to Integer. Returns True if all tests succeeded, False otherwise.

To use quickCheckAll, add a definition to your module along the lines of

return []
runTests = $quickCheckAll

and then execute runTests.

Note: the bizarre return [] in the example above is needed on GHC 7.8 and later; without it, quickCheckAll will not be able to find any of the properties. For the curious, the return [] is a Template Haskell splice that makes GHC insert the empty list of declarations at that point in the program; GHC typechecks everything before the return [] before it starts on the rest of the module, which means that the later call to quickCheckAll can see everything that was defined before the return []. Yikes!

verboseCheckAllQ Exp Source #

Test all properties in the current module. This is just a convenience function that combines quickCheckAll and verbose.

verboseCheckAll has the same issue with scoping as quickCheckAll: see the note there about return [].

labelledExamplesTestable prop ⇒ prop → IO () Source #

Given a property, which must use label, collect, classify or cover to associate labels with test cases, find an example test case for each possible label. The example test cases are minimised using shrinking.

For example, suppose we test delete x xs and record the number of times that x occurs in xs:

prop_delete :: Int -> [Int] -> Property
prop_delete x xs =
  classify (count x xs == 0) "count x xs == 0" $
  classify (count x xs == 1) "count x xs == 1" $
  classify (count x xs >= 2) "count x xs >= 2" $
  counterexample (show (delete x xs)) $
  count x (delete x xs) == max 0 (count x xs-1)
  where count x xs = length (filter (== x) xs)

labelledExamples generates three example test cases, one for each label:

>>> labelledExamples prop_delete
*** Found example of count x xs == 0
0
[]
[]

*** Found example of count x xs == 1
0
[0]
[]

*** Found example of count x xs >= 2
5
[5,5]
[5]

+++ OK, passed 100 tests:
78% count x xs == 0
21% count x xs == 1
 1% count x xs >= 2

labelledExamplesWithTestable prop ⇒ Args → prop → IO () Source #

A variant of labelledExamples that takes test arguments.

labelledExamplesResultTestable prop ⇒ prop → IO Result Source #

A variant of labelledExamples that returns a result.

labelledExamplesWithResultTestable prop ⇒ Args → prop → IO Result Source #

A variant of labelledExamples that takes test arguments and returns a result.

whenApplicative f ⇒ Bool → f () → f () #

Conditional execution of Applicative expressions. For example,

Examples

Expand
when debug (putStrLn "Debugging")

will output the string Debugging if the Boolean value debug is True, and otherwise do nothing.

>>> putStr "pi:" >> when False (print 3.14159)
pi:

unlessApplicative f ⇒ Bool → f () → f () #

The reverse of when.

Examples

Expand
>>> do x <- getLine
       unless (x == "hi") (putStrLn "hi!")
comingupwithexamplesisdifficult
hi!
>>> unless (pi > exp 1) Nothing
Just ()

(>=>)Monad m ⇒ (a → m b) → (b → m c) → a → m c infixr 1 #

Left-to-right composition of Kleisli arrows.

'(bs >=> cs) a' can be understood as the do expression

do b <- bs a
   cs b

or in terms of (>>=) as

bs a >>= cs

forM_ ∷ (Foldable t, Monad m) ⇒ t a → (a → m b) → m () #

forM_ is mapM_ with its arguments flipped. For a version that doesn't ignore the results see forM.

forM_ is just like for_, but specialised to monadic actions.

replicateMApplicative m ⇒ Int → m a → m [a] #

replicateM n act performs the action act n times, and then returns the list of results.

replicateM n (pure x) == replicate n x

Examples

Expand
>>> replicateM 3 getLine
hi
heya
hiya
["hi","heya","hiya"]
>>> import Control.Monad.State
>>> runState (replicateM 3 $ state $ \s -> (s, s + 1)) 1
([1,2,3],4)

replicateM_Applicative m ⇒ Int → m a → m () #

Like replicateM, but discards the result.

Examples

Expand
>>> replicateM_ 3 (putStr "a")
aaa

class NFData a #

A class of types that can be fully evaluated.

Since: deepseq-1.1.0.0

Instances

Instances details
NFData Key 
Instance details

Defined in Data.Aeson.Key

Methods

rnfKey → () #

NFData JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnfJSONPathElement → () #

NFData Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnfValue → () #

NFData AdjacencyIntMap 
Instance details

Defined in Algebra.Graph.AdjacencyIntMap

Methods

rnfAdjacencyIntMap → () #

NFData ByteArray

Since: deepseq-1.4.7.0

Instance details

Defined in Control.DeepSeq

Methods

rnfByteArray → () #

NFData ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Methods

rnfByteString64 → () #

NFData Buffer

Like the NFData instance for StrictByteString, this does not force the ForeignPtrContents field of the underlying ForeignPtr.

Since: bytestring-0.12.2.0

Instance details

Defined in Data.ByteString.Builder.Internal

Methods

rnfBuffer → () #

NFData BufferRange

Since: bytestring-0.12.2.0

Instance details

Defined in Data.ByteString.Builder.Internal

Methods

rnfBufferRange → () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

rnfByteString → () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

rnfByteString → () #

NFData ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

rnfShortByteString → () #

NFData XPrv 
Instance details

Defined in Cardano.Crypto.Wallet

Methods

rnfXPrv → () #

NFData XPub 
Instance details

Defined in Cardano.Crypto.Wallet

Methods

rnfXPub → () #

NFData XSignature 
Instance details

Defined in Cardano.Crypto.Wallet

Methods

rnfXSignature → () #

NFData EncryptedKey 
Instance details

Defined in Cardano.Crypto.Wallet.Encrypted

Methods

rnfEncryptedKey → () #

NFData Signature 
Instance details

Defined in Cardano.Crypto.Wallet.Encrypted

Methods

rnfSignature → () #

NFData XPub 
Instance details

Defined in Cardano.Crypto.Wallet.Pure

Methods

rnfXPub → () #

NFData ChainCode 
Instance details

Defined in Cardano.Crypto.Wallet.Types

Methods

rnfChainCode → () #

NFData PointCompressed 
Instance details

Defined in Crypto.Math.Edwards25519

Methods

rnfPointCompressed → () #

NFData Signature 
Instance details

Defined in Crypto.Math.Edwards25519

Methods

rnfSignature → () #

NFData Seed 
Instance details

Defined in Cardano.Crypto.Seed

Methods

rnfSeed → () #

NFData Point 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Methods

rnf ∷ Point → () #

NFData Proof 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Methods

rnfProof → () #

NFData SignKey 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Methods

rnfSignKey → () #

NFData VerKey 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Methods

rnfVerKey → () #

NFData Proof 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Methods

rnfProof → () #

NFData SignKey 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Methods

rnf ∷ SignKey → () #

NFData VerKey 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Methods

rnf ∷ VerKey → () #

NFData ProtocolMagicId 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

rnfProtocolMagicId → () #

NFData RequiresNetworkMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

rnfRequiresNetworkMagic → () #

NFData Raw 
Instance details

Defined in Cardano.Crypto.Raw

Methods

rnfRaw → () #

NFData CompactRedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Compact

NFData RedeemSigningKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.SigningKey

Methods

rnfRedeemSigningKey → () #

NFData RedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.VerificationKey

Methods

rnfRedeemVerificationKey → () #

NFData SigningKey 
Instance details

Defined in Cardano.Crypto.Signing.SigningKey

Methods

rnfSigningKey → () #

NFData VerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.VerificationKey

Methods

rnfVerificationKey → () #

NFData Version 
Instance details

Defined in Cardano.Ledger.Binary.Version

Methods

rnfVersion → () #

NFData AddrAttributes 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

Methods

rnfAddrAttributes → () #

NFData HDAddressPayload 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

Methods

rnfHDAddressPayload → () #

NFData AddrSpendingData 
Instance details

Defined in Cardano.Chain.Common.AddrSpendingData

Methods

rnfAddrSpendingData → () #

NFData AddrType 
Instance details

Defined in Cardano.Chain.Common.AddrSpendingData

Methods

rnfAddrType → () #

NFData Address 
Instance details

Defined in Cardano.Chain.Common.Address

Methods

rnfAddress → () #

NFData UnparsedFields 
Instance details

Defined in Cardano.Chain.Common.Attributes

Methods

rnfUnparsedFields → () #

NFData BlockCount 
Instance details

Defined in Cardano.Chain.Common.BlockCount

Methods

rnfBlockCount → () #

NFData ChainDifficulty 
Instance details

Defined in Cardano.Chain.Common.ChainDifficulty

Methods

rnfChainDifficulty → () #

NFData CompactAddress 
Instance details

Defined in Cardano.Chain.Common.Compact

Methods

rnfCompactAddress → () #

NFData Lovelace 
Instance details

Defined in Cardano.Chain.Common.Lovelace

Methods

rnfLovelace → () #

NFData LovelacePortion 
Instance details

Defined in Cardano.Chain.Common.LovelacePortion

Methods

rnfLovelacePortion → () #

NFData NetworkMagic 
Instance details

Defined in Cardano.Chain.Common.NetworkMagic

Methods

rnfNetworkMagic → () #

NFData TxFeePolicy 
Instance details

Defined in Cardano.Chain.Common.TxFeePolicy

Methods

rnfTxFeePolicy → () #

NFData TxSizeLinear 
Instance details

Defined in Cardano.Chain.Common.TxSizeLinear

Methods

rnfTxSizeLinear → () #

NFData State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Activation

Methods

rnfState → () #

NFData Environment 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Interface

Methods

rnfEnvironment → () #

NFData State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Interface

Methods

rnfState → () #

NFData Environment 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Methods

rnfEnvironment → () #

NFData ScheduledDelegation 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Methods

rnfScheduledDelegation → () #

NFData State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Methods

rnfState → () #

NFData SscPayload 
Instance details

Defined in Cardano.Chain.Ssc

Methods

rnfSscPayload → () #

NFData SscProof 
Instance details

Defined in Cardano.Chain.Ssc

Methods

rnfSscProof → () #

NFData UTxO 
Instance details

Defined in Cardano.Chain.UTxO.UTxO

Methods

rnfUTxO → () #

NFData ProposalBody 
Instance details

Defined in Cardano.Chain.Update.Proposal

Methods

rnfProposalBody → () #

NFData CandidateProtocolUpdate 
Instance details

Defined in Cardano.Chain.Update.Validation.Endorsement

Methods

rnfCandidateProtocolUpdate → () #

NFData Endorsement 
Instance details

Defined in Cardano.Chain.Update.Validation.Endorsement

Methods

rnfEndorsement → () #

NFData State 
Instance details

Defined in Cardano.Chain.Update.Validation.Interface

Methods

rnfState → () #

NFData ApplicationVersion 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Methods

rnfApplicationVersion → () #

NFData ProtocolUpdateProposal 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Methods

rnfProtocolUpdateProposal → () #

NFData SoftwareUpdateProposal 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Methods

rnfSoftwareUpdateProposal → () #

NFData Environment 
Instance details

Defined in Cardano.Chain.Update.Validation.Voting

Methods

rnfEnvironment → () #

NFData RegistrationEnvironment 
Instance details

Defined in Cardano.Chain.Update.Validation.Voting

Methods

rnfRegistrationEnvironment → () #

NFData Addr 
Instance details

Defined in Cardano.Ledger.Address

Methods

rnfAddr → () #

NFData BootstrapAddress 
Instance details

Defined in Cardano.Ledger.Address

Methods

rnfBootstrapAddress → () #

NFData CompactAddr 
Instance details

Defined in Cardano.Ledger.Address

Methods

rnfCompactAddr → () #

NFData RewardAccount 
Instance details

Defined in Cardano.Ledger.Address

Methods

rnfRewardAccount → () #

NFData Withdrawals 
Instance details

Defined in Cardano.Ledger.Address

Methods

rnfWithdrawals → () #

NFData ActiveSlotCoeff 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfActiveSlotCoeff → () #

NFData Anchor 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfAnchor → () #

NFData BlocksMade 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfBlocksMade → () #

NFData CertIx 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfCertIx → () #

NFData DnsName 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfDnsName → () #

NFData Globals 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfGlobals → () #

NFData Network 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfNetwork → () #

NFData NonNegativeInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfNonNegativeInterval → () #

NFData Nonce 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfNonce → () #

NFData Port 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfPort → () #

NFData PositiveInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfPositiveInterval → () #

NFData PositiveUnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfPositiveUnitInterval → () #

NFData ProtVer 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfProtVer → () #

NFData TxIx 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfTxIx → () #

NFData UnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfUnitInterval → () #

NFData Url 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfUrl → () #

NFData Coin 
Instance details

Defined in Cardano.Ledger.Coin

Methods

rnfCoin → () #

NFData DeltaCoin 
Instance details

Defined in Cardano.Ledger.Coin

Methods

rnfDeltaCoin → () #

NFData PoolCert 
Instance details

Defined in Cardano.Ledger.Core.TxCert

Methods

rnfPoolCert → () #

NFData Ptr 
Instance details

Defined in Cardano.Ledger.Credential

Methods

rnfPtr → () #

NFData SlotNo32 
Instance details

Defined in Cardano.Ledger.Credential

Methods

rnfSlotNo32 → () #

NFData StakeReference 
Instance details

Defined in Cardano.Ledger.Credential

Methods

rnfStakeReference → () #

NFData DRep 
Instance details

Defined in Cardano.Ledger.DRep

Methods

rnfDRep → () #

NFData DRepState 
Instance details

Defined in Cardano.Ledger.DRep

Methods

rnfDRepState → () #

NFData GenDelegPair 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

rnfGenDelegPair → () #

NFData GenDelegs 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

rnfGenDelegs → () #

NFData HashHeader 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

rnfHashHeader → () #

NFData ScriptHash 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

rnfScriptHash → () #

NFData TxAuxDataHash 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

rnfTxAuxDataHash → () #

NFData BootstrapWitness 
Instance details

Defined in Cardano.Ledger.Keys.Bootstrap

Methods

rnfBootstrapWitness → () #

NFData ChainCode 
Instance details

Defined in Cardano.Ledger.Keys.Bootstrap

Methods

rnfChainCode → () #

NFData Metadatum 
Instance details

Defined in Cardano.Ledger.Metadata

Methods

rnfMetadatum → () #

NFData CostModel 
Instance details

Defined in Cardano.Ledger.Plutus.CostModels

Methods

rnfCostModel → () #

NFData CostModels 
Instance details

Defined in Cardano.Ledger.Plutus.CostModels

Methods

rnfCostModels → () #

NFData PlutusDebugInfo 
Instance details

Defined in Cardano.Ledger.Plutus.Evaluate

Methods

rnfPlutusDebugInfo → () #

NFData PlutusWithContext 
Instance details

Defined in Cardano.Ledger.Plutus.Evaluate

Methods

rnfPlutusWithContext → () #

NFData ExUnits 
Instance details

Defined in Cardano.Ledger.Plutus.ExUnits

Methods

rnfExUnits → () #

NFData Prices 
Instance details

Defined in Cardano.Ledger.Plutus.ExUnits

Methods

rnfPrices → () #

NFData Language 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfLanguage → () #

NFData PlutusBinary 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfPlutusBinary → () #

NFData TxOutSource 
Instance details

Defined in Cardano.Ledger.Plutus.TxInfo

Methods

rnfTxOutSource → () #

NFData Reward 
Instance details

Defined in Cardano.Ledger.Rewards

Methods

rnfReward → () #

NFData RewardType 
Instance details

Defined in Cardano.Ledger.Rewards

Methods

rnfRewardType → () #

NFData CommitteeAuthorization 
Instance details

Defined in Cardano.Ledger.State.CertState

Methods

rnfCommitteeAuthorization → () #

NFData FutureGenDeleg 
Instance details

Defined in Cardano.Ledger.State.CertState

Methods

rnfFutureGenDeleg → () #

NFData InstantaneousRewards 
Instance details

Defined in Cardano.Ledger.State.CertState

Methods

rnfInstantaneousRewards → () #

NFData Obligations 
Instance details

Defined in Cardano.Ledger.State.CertState

Methods

rnfObligations → () #

NFData ChainAccountState 
Instance details

Defined in Cardano.Ledger.State.ChainAccount

Methods

rnfChainAccountState → () #

NFData IndividualPoolStake 
Instance details

Defined in Cardano.Ledger.State.PoolDistr

Methods

rnfIndividualPoolStake → () #

NFData PoolDistr 
Instance details

Defined in Cardano.Ledger.State.PoolDistr

Methods

rnfPoolDistr → () #

NFData SnapShot 
Instance details

Defined in Cardano.Ledger.State.SnapShots

Methods

rnfSnapShot → () #

NFData SnapShots 
Instance details

Defined in Cardano.Ledger.State.SnapShots

Methods

rnfSnapShots → () #

NFData Stake 
Instance details

Defined in Cardano.Ledger.State.SnapShots

Methods

rnfStake → () #

NFData PoolMetadata 
Instance details

Defined in Cardano.Ledger.State.StakePool

Methods

rnfPoolMetadata → () #

NFData StakePoolParams 
Instance details

Defined in Cardano.Ledger.State.StakePool

Methods

rnfStakePoolParams → () #

NFData StakePoolRelay 
Instance details

Defined in Cardano.Ledger.State.StakePool

Methods

rnfStakePoolRelay → () #

NFData StakePoolState 
Instance details

Defined in Cardano.Ledger.State.StakePool

Methods

rnfStakePoolState → () #

NFData TxId 
Instance details

Defined in Cardano.Ledger.TxIn

Methods

rnfTxId → () #

NFData TxIn 
Instance details

Defined in Cardano.Ledger.TxIn

Methods

rnfTxIn → () #

NFData PlutusArgs Source # 
Instance details

Defined in Test.Cardano.Ledger.Plutus.ScriptTestContext

Methods

rnfPlutusArgs → () #

NFData ScriptTestContext Source # 
Instance details

Defined in Test.Cardano.Ledger.Plutus.ScriptTestContext

Methods

rnfScriptTestContext → () #

NFData BlockNo 
Instance details

Defined in Cardano.Slotting.Block

Methods

rnfBlockNo → () #

NFData EpochInterval 
Instance details

Defined in Cardano.Slotting.Slot

Methods

rnfEpochInterval → () #

NFData EpochNo 
Instance details

Defined in Cardano.Slotting.Slot

Methods

rnfEpochNo → () #

NFData EpochSize 
Instance details

Defined in Cardano.Slotting.Slot

Methods

rnfEpochSize → () #

NFData SlotNo 
Instance details

Defined in Cardano.Slotting.Slot

Methods

rnfSlotNo → () #

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnfIntSet → () #

NFData PublicKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnfPublicKey → () #

NFData SecretKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnfSecretKey → () #

NFData Signature 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnfSignature → () #

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfVoid → () #

NFData ThreadId

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfThreadId → () #

NFData All

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfAll → () #

NFData Any

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfAny → () #

NFData TypeRep

NOTE: Prior to deepseq-1.4.4.0 this instance was only defined for base-4.8.0.0 and later.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfTypeRep → () #

NFData Unique

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfUnique → () #

NFData Version

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfVersion → () #

NFData Fingerprint

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfFingerprint → () #

NFData CBool

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCBool → () #

NFData CChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCChar → () #

NFData CClock

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCClock → () #

NFData CDouble

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCDouble → () #

NFData CFile

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCFile → () #

NFData CFloat

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCFloat → () #

NFData CFpos

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCFpos → () #

NFData CInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCInt → () #

NFData CIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCIntMax → () #

NFData CIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCIntPtr → () #

NFData CJmpBuf

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCJmpBuf → () #

NFData CLLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCLLong → () #

NFData CLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCLong → () #

NFData CPtrdiff

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCPtrdiff → () #

NFData CSChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCSChar → () #

NFData CSUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCSUSeconds → () #

NFData CShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCShort → () #

NFData CSigAtomic

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCSigAtomic → () #

NFData CSize

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCSize → () #

NFData CTime

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCTime → () #

NFData CUChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCUChar → () #

NFData CUInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCUInt → () #

NFData CUIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCUIntMax → () #

NFData CUIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCUIntPtr → () #

NFData CULLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCULLong → () #

NFData CULong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCULong → () #

NFData CUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCUSeconds → () #

NFData CUShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCUShort → () #

NFData CWchar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCWchar → () #

NFData MaskingState

Since: deepseq-1.4.4.0

Instance details

Defined in Control.DeepSeq

Methods

rnfMaskingState → () #

NFData ExitCode

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfExitCode → () #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnfInt16 → () #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnfInt32 → () #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnfInt64 → () #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnfInt8 → () #

NFData CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCallStack → () #

NFData SrcLoc

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfSrcLoc → () #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnfWord16 → () #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnfWord32 → () #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnfWord64 → () #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnfWord8 → () #

NFData Module

Since: deepseq-1.4.8.0

Instance details

Defined in Control.DeepSeq

Methods

rnfModule → () #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnfOrdering → () #

NFData TyCon

NOTE: Prior to deepseq-1.4.4.0 this instance was only defined for base-4.8.0.0 and later.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfTyCon → () #

NFData Half 
Instance details

Defined in Numeric.Half.Internal

Methods

rnfHalf → () #

NFData FailureReason 
Instance details

Defined in Test.Hspec.Core.Example

Methods

rnfFailureReason → () #

NFData IPv4 
Instance details

Defined in Cardano.Ledger.Orphans

Methods

rnfIPv4 → () #

NFData IPv6 
Instance details

Defined in Cardano.Ledger.Orphans

Methods

rnfIPv6 → () #

NFData InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnfInvalidPosException → () #

NFData Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnfPos → () #

NFData SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnfSourcePos → () #

NFData Bytes 
Instance details

Defined in Data.ByteArray.Bytes

Methods

rnfBytes → () #

NFData URI 
Instance details

Defined in Network.URI

Methods

rnfURI → () #

NFData URIAuth 
Instance details

Defined in Network.URI

Methods

rnfURIAuth → () #

NFData OsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnfOsChar → () #

NFData OsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnfOsString → () #

NFData PosixChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnfPosixChar → () #

NFData PosixString 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnfPosixString → () #

NFData WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnfWindowsChar → () #

NFData WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnfWindowsString → () #

NFData SrcSpan 
Instance details

Defined in PlutusCore.Annotation

Methods

rnfSrcSpan → () #

NFData SrcSpans 
Instance details

Defined in PlutusCore.Annotation

Methods

rnfSrcSpans → () #

NFData UnliftingError 
Instance details

Defined in PlutusCore.Builtin.Result

Methods

rnfUnliftingError → () #

NFData UnliftingEvaluationError 
Instance details

Defined in PlutusCore.Builtin.Result

Methods

rnfUnliftingEvaluationError → () #

NFData Data 
Instance details

Defined in PlutusCore.Data

Methods

rnfData → () #

NFData DeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

rnfDeBruijn → () #

NFData FakeNamedDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

rnfFakeNamedDeBruijn → () #

NFData FreeVariableError 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

rnfFreeVariableError → () #

NFData Index 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

rnfIndex → () #

NFData NamedDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

rnfNamedDeBruijn → () #

NFData NamedTyDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

rnfNamedTyDeBruijn → () #

NFData TyDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

rnfTyDeBruijn → () #

NFData DefaultFun 
Instance details

Defined in PlutusCore.Default.Builtins

Methods

rnfDefaultFun → () #

NFData ParserError 
Instance details

Defined in PlutusCore.Error

Methods

rnfParserError → () #

NFData ParserErrorBundle 
Instance details

Defined in PlutusCore.Error

Methods

rnfParserErrorBundle → () #

NFData CkUserError 
Instance details

Defined in PlutusCore.Evaluation.Machine.Ck

Methods

rnf ∷ CkUserError → () #

NFData CostModelApplyError 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostModelInterface

Methods

rnfCostModelApplyError → () #

NFData Coefficient0 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient0 → () #

NFData Coefficient00 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient00 → () #

NFData Coefficient01 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient01 → () #

NFData Coefficient02 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient02 → () #

NFData Coefficient1 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient1 → () #

NFData Coefficient10 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient10 → () #

NFData Coefficient11 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient11 → () #

NFData Coefficient12 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient12 → () #

NFData Coefficient2 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient2 → () #

NFData Coefficient20 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCoefficient20 → () #

NFData ExpModCostingFunction 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfExpModCostingFunction → () #

NFData Intercept 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfIntercept → () #

NFData ModelConstantOrLinear 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelConstantOrLinear → () #

NFData ModelConstantOrOneArgument 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelConstantOrOneArgument → () #

NFData ModelConstantOrTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

NFData ModelFiveArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelFiveArguments → () #

NFData ModelFourArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelFourArguments → () #

NFData ModelOneArgument 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelOneArgument → () #

NFData ModelSixArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelSixArguments → () #

NFData ModelSubtractedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelSubtractedSizes → () #

NFData ModelThreeArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelThreeArguments → () #

NFData ModelTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfModelTwoArguments → () #

NFData OneVariableLinearFunction 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfOneVariableLinearFunction → () #

NFData OneVariableQuadraticFunction 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

NFData Slope 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfSlope → () #

NFData TwoVariableLinearFunction 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfTwoVariableLinearFunction → () #

NFData TwoVariableQuadraticFunction 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

NFData ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Methods

rnfExBudget → () #

NFData ExRestrictingBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Methods

rnfExRestrictingBudget → () #

NFData ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

rnfExCPU → () #

NFData ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

rnfExMemory → () #

NFData Name 
Instance details

Defined in PlutusCore.Name.Unique

Methods

rnfName → () #

NFData TyName 
Instance details

Defined in PlutusCore.Name.Unique

Methods

rnfTyName → () #

NFData Unique 
Instance details

Defined in PlutusCore.Name.Unique

Methods

rnfUnique → () #

NFData K 
Instance details

Defined in PlutusCore.Value

Methods

rnfK → () #

NFData Quantity 
Instance details

Defined in PlutusCore.Value

Methods

rnfQuantity → () #

NFData Value 
Instance details

Defined in PlutusCore.Value

Methods

rnfValue → () #

NFData Version 
Instance details

Defined in PlutusCore.Version

Methods

rnfVersion → () #

NFData CountingSt 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

rnfCountingSt → () #

NFData RestrictingSt 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

rnfRestrictingSt → () #

NFData CekUserError 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Methods

rnfCekUserError → () #

NFData StepKind 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Methods

rnfStepKind → () #

NFData Filler 
Instance details

Defined in PlutusCore.Flat.Filler

Methods

rnfFiller → () #

NFData SatInt 
Instance details

Defined in Data.SatInt

Methods

rnfSatInt → () #

NFData EvaluationContext 
Instance details

Defined in PlutusLedgerApi.Common.Eval

Methods

rnfEvaluationContext → () #

NFData ScriptForEvaluation 
Instance details

Defined in PlutusLedgerApi.Common.SerialisedScript

Methods

rnfScriptForEvaluation → () #

NFData ScriptNamedDeBruijn 
Instance details

Defined in PlutusLedgerApi.Common.SerialisedScript

Methods

rnfScriptNamedDeBruijn → () #

NFData PlutusLedgerLanguage 
Instance details

Defined in PlutusLedgerApi.Common.Versions

Methods

rnfPlutusLedgerLanguage → () #

NFData Address 
Instance details

Defined in PlutusLedgerApi.V1.Address

Methods

rnfAddress → () #

NFData LedgerBytes 
Instance details

Defined in PlutusLedgerApi.V1.Bytes

Methods

rnfLedgerBytes → () #

NFData ScriptContext 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfScriptContext → () #

NFData Credential 
Instance details

Defined in PlutusLedgerApi.V1.Credential

Methods

rnfCredential → () #

NFData StakingCredential 
Instance details

Defined in PlutusLedgerApi.V1.Credential

Methods

rnfStakingCredential → () #

NFData PubKeyHash 
Instance details

Defined in PlutusLedgerApi.V1.Crypto

Methods

rnfPubKeyHash → () #

NFData DCert 
Instance details

Defined in PlutusLedgerApi.V1.DCert

Methods

rnfDCert → () #

NFData Address 
Instance details

Defined in PlutusLedgerApi.V1.Data.Address

Methods

rnfAddress → () #

NFData Credential 
Instance details

Defined in PlutusLedgerApi.V1.Data.Credential

Methods

rnfCredential → () #

NFData StakingCredential 
Instance details

Defined in PlutusLedgerApi.V1.Data.Credential

Methods

rnfStakingCredential → () #

NFData DCert 
Instance details

Defined in PlutusLedgerApi.V1.Data.DCert

Methods

rnfDCert → () #

NFData DiffMilliSeconds 
Instance details

Defined in PlutusLedgerApi.V1.Data.Time

Methods

rnfDiffMilliSeconds → () #

NFData POSIXTime 
Instance details

Defined in PlutusLedgerApi.V1.Data.Time

Methods

rnfPOSIXTime → () #

NFData RedeemerPtr 
Instance details

Defined in PlutusLedgerApi.V1.Data.Tx

Methods

rnfRedeemerPtr → () #

NFData ScriptTag 
Instance details

Defined in PlutusLedgerApi.V1.Data.Tx

Methods

rnfScriptTag → () #

NFData TxId 
Instance details

Defined in PlutusLedgerApi.V1.Data.Tx

Methods

rnfTxId → () #

NFData TxOutRef 
Instance details

Defined in PlutusLedgerApi.V1.Data.Tx

Methods

rnfTxOutRef → () #

NFData AssetClass 
Instance details

Defined in PlutusLedgerApi.V1.Data.Value

Methods

rnfAssetClass → () #

NFData CurrencySymbol 
Instance details

Defined in PlutusLedgerApi.V1.Data.Value

Methods

rnfCurrencySymbol → () #

NFData TokenName 
Instance details

Defined in PlutusLedgerApi.V1.Data.Value

Methods

rnfTokenName → () #

NFData Datum 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

rnfDatum → () #

NFData DatumHash 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

rnfDatumHash → () #

NFData Redeemer 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

rnfRedeemer → () #

NFData RedeemerHash 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

rnfRedeemerHash → () #

NFData ScriptError 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

rnfScriptError → () #

NFData ScriptHash 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

rnfScriptHash → () #

NFData DiffMilliSeconds 
Instance details

Defined in PlutusLedgerApi.V1.Time

Methods

rnfDiffMilliSeconds → () #

NFData POSIXTime 
Instance details

Defined in PlutusLedgerApi.V1.Time

Methods

rnfPOSIXTime → () #

NFData RedeemerPtr 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

rnfRedeemerPtr → () #

NFData ScriptTag 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

rnfScriptTag → () #

NFData TxId 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

rnfTxId → () #

NFData TxOut 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

rnfTxOut → () #

NFData TxOutRef 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

rnfTxOutRef → () #

NFData AssetClass 
Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

rnfAssetClass → () #

NFData CurrencySymbol 
Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

rnfCurrencySymbol → () #

NFData TokenName 
Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

rnfTokenName → () #

NFData Value 
Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

rnfValue → () #

NFData ScriptContext 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfScriptContext → () #

NFData OutputDatum 
Instance details

Defined in PlutusLedgerApi.V2.Data.Tx

Methods

rnfOutputDatum → () #

NFData OutputDatum 
Instance details

Defined in PlutusLedgerApi.V2.Tx

Methods

rnfOutputDatum → () #

NFData TxOut 
Instance details

Defined in PlutusLedgerApi.V2.Tx

Methods

rnfTxOut → () #

NFData ScriptContext 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfScriptContext → () #

NFData TxId 
Instance details

Defined in PlutusLedgerApi.V3.Data.Tx

Methods

rnfTxId → () #

NFData TxOutRef 
Instance details

Defined in PlutusLedgerApi.V3.Data.Tx

Methods

rnfTxOutRef → () #

NFData MintValue 
Instance details

Defined in PlutusLedgerApi.V3.MintValue

Methods

rnfMintValue → () #

NFData TxId 
Instance details

Defined in PlutusLedgerApi.V3.Tx

Methods

rnfTxId → () #

NFData TxOutRef 
Instance details

Defined in PlutusLedgerApi.V3.Tx

Methods

rnfTxOutRef → () #

NFData BuiltinByteStringHex 
Instance details

Defined in PlutusTx.Builtins.HasOpaque

Methods

rnfBuiltinByteStringHex → () #

NFData BuiltinByteStringUtf8 
Instance details

Defined in PlutusTx.Builtins.HasOpaque

Methods

rnfBuiltinByteStringUtf8 → () #

NFData BuiltinBLS12_381_G1_Element 
Instance details

Defined in PlutusTx.Builtins.Internal

NFData BuiltinBLS12_381_G2_Element 
Instance details

Defined in PlutusTx.Builtins.Internal

NFData BuiltinBLS12_381_MlResult 
Instance details

Defined in PlutusTx.Builtins.Internal

Methods

rnfBuiltinBLS12_381_MlResult → () #

NFData BuiltinByteString 
Instance details

Defined in PlutusTx.Builtins.Internal

Methods

rnfBuiltinByteString → () #

NFData BuiltinData 
Instance details

Defined in PlutusTx.Builtins.Internal

Methods

rnfBuiltinData → () #

NFData CovLoc 
Instance details

Defined in PlutusTx.Coverage

Methods

rnfCovLoc → () #

NFData CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

Methods

rnfCoverageAnnotation → () #

NFData CoverageData 
Instance details

Defined in PlutusTx.Coverage

Methods

rnfCoverageData → () #

NFData CoverageIndex 
Instance details

Defined in PlutusTx.Coverage

Methods

rnfCoverageIndex → () #

NFData CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

Methods

rnfCoverageMetadata → () #

NFData CoverageReport 
Instance details

Defined in PlutusTx.Coverage

Methods

rnfCoverageReport → () #

NFData Metadata 
Instance details

Defined in PlutusTx.Coverage

Methods

rnfMetadata → () #

NFData TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnfTextDetails → () #

NFData Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

rnfDoc → () #

NFData StdGen 
Instance details

Defined in System.Random.Internal

Methods

rnfStdGen → () #

NFData Scientific 
Instance details

Defined in Data.Scientific

Methods

rnfScientific → () #

NFData UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Methods

rnfUnicodeException → () #

NFData Text 
Instance details

Defined in Data.Text

Methods

rnfText → () #

NFData Text 
Instance details

Defined in Data.Text.Lazy

Methods

rnfText → () #

NFData ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

rnfShortText → () #

NFData Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

rnfMonth → () #

NFData Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

rnfQuarter → () #

NFData QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

rnfQuarterOfYear → () #

NFData NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

rnfNominalDiffTime → () #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnfUTCTime → () #

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnfLocalTime → () #

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnfZonedTime → () #

NFData EditExpr 
Instance details

Defined in Data.TreeDiff.Expr

Methods

rnfEditExpr → () #

NFData Expr 
Instance details

Defined in Data.TreeDiff.Expr

Methods

rnfExpr → () #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnfUUID → () #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnfInteger → () #

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfNatural → () #

NFData () 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ () → () #

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnfBool → () #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnfChar → () #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnfDouble → () #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnfFloat → () #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnfInt → () #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnfWord → () #

NFData a ⇒ NFData (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

rnfOnly a → () #

NFData v ⇒ NFData (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

rnfKeyMap v → () #

NFData a ⇒ NFData (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnfIResult a → () #

NFData a ⇒ NFData (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnfResult a → () #

NFData a ⇒ NFData (Graph a) 
Instance details

Defined in Algebra.Graph

Methods

rnfGraph a → () #

NFData a ⇒ NFData (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.AdjacencyMap

Methods

rnfAdjacencyMap a → () #

NFData a ⇒ NFData (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.NonEmpty.AdjacencyMap

Methods

rnfAdjacencyMap a → () #

NFData a ⇒ NFData (Relation a) 
Instance details

Defined in Algebra.Graph.Relation

Methods

rnfRelation a → () #

NFData a ⇒ NFData (Relation a) 
Instance details

Defined in Algebra.Graph.Relation.Symmetric

Methods

rnfRelation a → () #

NFData a ⇒ NFData (Graph a) 
Instance details

Defined in Algebra.Graph.Undirected

Methods

rnfGraph a → () #

NFData (MutableByteArray s)

Since: deepseq-1.4.8.0

Instance details

Defined in Control.DeepSeq

Methods

rnfMutableByteArray s → () #

NFData a ⇒ NFData (Complex a) 
Instance details

Defined in Control.DeepSeq

Methods

rnfComplex a → () #

NFData a ⇒ NFData (First a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfFirst a → () #

NFData a ⇒ NFData (Last a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfLast a → () #

NFData a ⇒ NFData (Max a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfMax a → () #

NFData a ⇒ NFData (Min a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfMin a → () #

NFData m ⇒ NFData (WrappedMonoid m)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfWrappedMonoid m → () #

NFData (SigDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Methods

rnfSigDSIGN EcdsaSecp256k1DSIGN → () #

NFData (SigDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Methods

rnfSigDSIGN Ed25519DSIGN → () #

NFData (SigDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Methods

rnfSigDSIGN MockDSIGN → () #

NFData (SigDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

NFData (SignKeyDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

NFData (SignKeyDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Methods

rnfSignKeyDSIGN Ed25519DSIGN → () #

NFData (SignKeyDSIGN Ed448DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed448

Methods

rnfSignKeyDSIGN Ed448DSIGN → () #

NFData (SignKeyDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Methods

rnfSignKeyDSIGN MockDSIGN → () #

NFData (SignKeyDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

NFData (SignKeyDSIGNM Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Methods

rnfSignKeyDSIGNM Ed25519DSIGN → () #

NFData (VerKeyDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

NFData (VerKeyDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Methods

rnfVerKeyDSIGN Ed25519DSIGN → () #

NFData (VerKeyDSIGN Ed448DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed448

Methods

rnfVerKeyDSIGN Ed448DSIGN → () #

NFData (VerKeyDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Methods

rnfVerKeyDSIGN MockDSIGN → () #

NFData (VerKeyDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

(NFData (SigDSIGN d), NFData (VerKeyDSIGN d)) ⇒ NFData (SigKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Methods

rnfSigKES (CompactSingleKES d) → () #

(NFData (SigKES d), NFData (VerKeyKES d)) ⇒ NFData (SigKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Methods

rnfSigKES (CompactSumKES h d) → () #

NFData (SigDSIGN d) ⇒ NFData (SigKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

rnfSigKES (SingleKES d) → () #

(NFData (SigKES d), NFData (VerKeyKES d)) ⇒ NFData (SigKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

rnfSigKES (SumKES h d) → () #

NFData (SignKeyDSIGNM d) ⇒ NFData (SignKeyKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Methods

rnfSignKeyKES (CompactSingleKES d) → () #

(NFData (SignKeyKES d), NFData (VerKeyKES d)) ⇒ NFData (SignKeyKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Methods

rnfSignKeyKES (CompactSumKES h d) → () #

NFData (SignKeyDSIGNM d) ⇒ NFData (SignKeyKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

rnfSignKeyKES (SingleKES d) → () #

(NFData (SignKeyKES d), NFData (VerKeyKES d)) ⇒ NFData (SignKeyKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

rnfSignKeyKES (SumKES h d) → () #

NFData (VerKeyDSIGN d) ⇒ NFData (VerKeyKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Methods

rnfVerKeyKES (CompactSingleKES d) → () #

NFData (VerKeyKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Methods

rnfVerKeyKES (CompactSumKES h d) → () #

NFData (VerKeyDSIGN d) ⇒ NFData (VerKeyKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

rnfVerKeyKES (SingleKES d) → () #

NFData (VerKeyKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

rnfVerKeyKES (SumKES h d) → () #

NFData (MLockedSizedBytes n) 
Instance details

Defined in Cardano.Crypto.Libsodium.MLockedBytes.Internal

Methods

rnfMLockedSizedBytes n → () #

NFData (MLockedSeed n) 
Instance details

Defined in Cardano.Crypto.Libsodium.MLockedSeed

Methods

rnfMLockedSeed n → () #

NFData (MLockedForeignPtr a) 
Instance details

Defined in Cardano.Crypto.Libsodium.Memory.Internal

Methods

rnfMLockedForeignPtr a → () #

NFData (PackedBytes n) 
Instance details

Defined in Cardano.Crypto.PackedBytes

Methods

rnfPackedBytes n → () #

NFData (PinnedSizedBytes n) 
Instance details

Defined in Cardano.Crypto.PinnedSizedBytes

Methods

rnfPinnedSizedBytes n → () #

NFData (CertVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Methods

rnfCertVRF SimpleVRF → () #

NFData (CertVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Methods

rnfCertVRF PraosVRF → () #

NFData (CertVRF PraosBatchCompatVRF) 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Methods

rnfCertVRF PraosBatchCompatVRF → () #

NFData (OutputVRF v) 
Instance details

Defined in Cardano.Crypto.VRF.Class

Methods

rnfOutputVRF v → () #

NFData (SignKeyVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Methods

rnfSignKeyVRF SimpleVRF → () #

NFData (SignKeyVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Methods

rnfSignKeyVRF PraosVRF → () #

NFData (SignKeyVRF PraosBatchCompatVRF) 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

NFData (VerKeyVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Methods

rnfVerKeyVRF SimpleVRF → () #

NFData (VerKeyVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Methods

rnfVerKeyVRF PraosVRF → () #

NFData (VerKeyVRF PraosBatchCompatVRF) 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

NFData a ⇒ NFData (AProtocolMagic a) 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

rnfAProtocolMagic a → () #

NFData (RedeemSignature a) 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Signature

Methods

rnfRedeemSignature a → () #

NFData (Signature a) 
Instance details

Defined in Cardano.Crypto.Signing.Signature

Methods

rnfSignature a → () #

NFData a ⇒ NFData (Sized a) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Sized

Methods

rnfSized a → () #

NFData h ⇒ NFData (Attributes h) 
Instance details

Defined in Cardano.Chain.Common.Attributes

Methods

rnfAttributes h → () #

NFData a ⇒ NFData (MerkleNode a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Methods

rnfMerkleNode a → () #

NFData (MerkleRoot a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Methods

rnfMerkleRoot a → () #

NFData a ⇒ NFData (MerkleTree a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Methods

rnfMerkleTree a → () #

NFData a ⇒ NFData (AProposal a) 
Instance details

Defined in Cardano.Chain.Update.Proposal

Methods

rnfAProposal a → () #

NFData a ⇒ NFData (AVote a) 
Instance details

Defined in Cardano.Chain.Update.Vote

Methods

rnfAVote a → () #

NFData a ⇒ NFData (NonZero a) 
Instance details

Defined in Cardano.Ledger.BaseTypes.NonZero

Methods

rnfNonZero a → () #

NFData (CompactForm Coin) 
Instance details

Defined in Cardano.Ledger.Coin

Methods

rnfCompactForm Coin → () #

NFData (CompactForm DeltaCoin) 
Instance details

Defined in Cardano.Ledger.Coin

Methods

rnfCompactForm DeltaCoin → () #

NFData (PParamsHKD Identity era) ⇒ NFData (PParams era) 
Instance details

Defined in Cardano.Ledger.Core.PParams

Methods

rnfPParams era → () #

NFData (PParamsHKD StrictMaybe era) ⇒ NFData (PParamsUpdate era) 
Instance details

Defined in Cardano.Ledger.Core.PParams

Methods

rnfPParamsUpdate era → () #

NFData (Credential r) 
Instance details

Defined in Cardano.Ledger.Credential

Methods

rnfCredential r → () #

NFData (NoUpdate a) 
Instance details

Defined in Cardano.Ledger.HKD

Methods

rnfNoUpdate a → () #

NFData (KeyHash r) 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

rnfKeyHash r → () #

NFData (SafeHash i) 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

rnfSafeHash i → () #

NFData (VRFVerKeyHash r) 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

rnfVRFVerKeyHash r → () #

NFData (VKey kd) 
Instance details

Defined in Cardano.Ledger.Keys.Internal

Methods

rnfVKey kd → () #

NFData (WitVKey kr) 
Instance details

Defined in Cardano.Ledger.Keys.WitVKey

Methods

rnfWitVKey kr → () #

NFData t ⇒ NFData (MemoBytes t) 
Instance details

Defined in Cardano.Ledger.MemoBytes.Internal

Methods

rnfMemoBytes t → () #

NFData (Data era) 
Instance details

Defined in Cardano.Ledger.Plutus.Data

Methods

rnfData era → () #

NFData (PlutusData era) 
Instance details

Defined in Cardano.Ledger.Plutus.Data

Methods

rnfPlutusData era → () #

NFData a ⇒ NFData (ExUnits' a) 
Instance details

Defined in Cardano.Ledger.Plutus.ExUnits

Methods

rnfExUnits' a → () #

NFData (PlutusScriptContext l) ⇒ NFData (LegacyPlutusArgs l) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfLegacyPlutusArgs l → () #

NFData (Plutus l) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfPlutus l → () #

NFData (PlutusArgs 'PlutusV1) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfPlutusArgs 'PlutusV1 → () #

NFData (PlutusArgs 'PlutusV2) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfPlutusArgs 'PlutusV2 → () #

NFData (PlutusArgs 'PlutusV3) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfPlutusArgs 'PlutusV3 → () #

NFData (PlutusArgs 'PlutusV4) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfPlutusArgs 'PlutusV4 → () #

NFData (PlutusRunnable l) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

rnfPlutusRunnable l → () #

NFData (CommitteeState era) 
Instance details

Defined in Cardano.Ledger.State.CertState

Methods

rnfCommitteeState era → () #

NFData (Accounts era) ⇒ NFData (DState era) 
Instance details

Defined in Cardano.Ledger.State.CertState

Methods

rnfDState era → () #

NFData (PState era) 
Instance details

Defined in Cardano.Ledger.State.CertState

Methods

rnfPState era → () #

NFData (PParams era) ⇒ NFData (FuturePParams era) 
Instance details

Defined in Cardano.Ledger.State.Governance

Methods

rnfFuturePParams era → () #

(Era era, NFData (Script era)) ⇒ NFData (ScriptsProvided era) 
Instance details

Defined in Cardano.Ledger.State.UTxO

Methods

rnfScriptsProvided era → () #

(Era era, NFData (TxOut era)) ⇒ NFData (UTxO era) 
Instance details

Defined in Cardano.Ledger.State.UTxO

Methods

rnfUTxO era → () #

NFData (KeyPair kd) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.KeyPair

Methods

rnfKeyPair kd → () #

NFData a ⇒ NFData (WithOrigin a) 
Instance details

Defined in Cardano.Slotting.Slot

Methods

rnfWithOrigin a → () #

NFData a ⇒ NFData (StrictMaybe a) 
Instance details

Defined in Data.Maybe.Strict

Methods

rnfStrictMaybe a → () #

NFData a ⇒ NFData (StrictSeq a) 
Instance details

Defined in Data.Sequence.Strict

Methods

rnfStrictSeq a → () #

NFData a ⇒ NFData (SCC a) 
Instance details

Defined in Data.Graph

Methods

rnfSCC a → () #

NFData a ⇒ NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnfIntMap a → () #

NFData a ⇒ NFData (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnfDigit a → () #

NFData a ⇒ NFData (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnfElem a → () #

NFData a ⇒ NFData (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnfFingerTree a → () #

NFData a ⇒ NFData (Node a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnfNode a → () #

NFData a ⇒ NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnfSeq a → () #

NFData a ⇒ NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnfSet a → () #

NFData a ⇒ NFData (Tree a) 
Instance details

Defined in Data.Tree

Methods

rnfTree a → () #

NFData (Context a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnfContext a → () #

NFData (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnfDigest a → () #

NFData1 f ⇒ NFData (Fix f) 
Instance details

Defined in Data.Fix

Methods

rnfFix f → () #

NFData a ⇒ NFData (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

rnfDNonEmpty a → () #

NFData a ⇒ NFData (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

rnfDList a → () #

NFData a ⇒ NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfNonEmpty a → () #

NFData a ⇒ NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfIdentity a → () #

NFData a ⇒ NFData (First a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfFirst a → () #

NFData a ⇒ NFData (Last a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfLast a → () #

NFData a ⇒ NFData (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfDown a → () #

NFData a ⇒ NFData (Dual a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfDual a → () #

NFData a ⇒ NFData (Product a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfProduct a → () #

NFData a ⇒ NFData (Sum a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfSum a → () #

NFData a ⇒ NFData (ZipList a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfZipList a → () #

NFData (IORef a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfIORef a → () #

NFData (MVar a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfMVar a → () #

NFData (FunPtr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfFunPtr a → () #

NFData (Ptr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfPtr a → () #

NFData a ⇒ NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnfRatio a → () #

NFData (StableName a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfStableName a → () #

NFData a ⇒ NFData (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

rnfHashed a → () #

NFData a ⇒ NFData (ErrorFancy a) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnfErrorFancy a → () #

NFData t ⇒ NFData (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnfErrorItem t → () #

NFData s ⇒ NFData (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

rnfPosState s → () #

NFData (CaserBuiltin uni) 
Instance details

Defined in PlutusCore.Builtin.Case

Methods

rnfCaserBuiltin uni → () #

NFData (BuiltinSemanticsVariant DefaultFun) 
Instance details

Defined in PlutusCore.Default.Builtins

NFData (BuiltinRuntime val) 
Instance details

Defined in PlutusCore.Builtin.Runtime

Methods

rnfBuiltinRuntime val → () #

NFData ann ⇒ NFData (Kind ann) 
Instance details

Defined in PlutusCore.Core.Type

Methods

rnfKind ann → () #

NFData a ⇒ NFData (Normalized a) 
Instance details

Defined in PlutusCore.Core.Type

Methods

rnfNormalized a → () #

NFData a ⇒ NFData (ExpectedShapeOr a) 
Instance details

Defined in PlutusCore.Error

Methods

rnfExpectedShapeOr a → () #

NFData ann ⇒ NFData (UniqueError ann) 
Instance details

Defined in PlutusCore.Error

Methods

rnfUniqueError ann → () #

AllArgumentModels NFData f ⇒ NFData (BuiltinCostModelBase f) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

rnfBuiltinCostModelBase f → () #

NFData model ⇒ NFData (CostingFun model) 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Methods

rnfCostingFun model → () #

NFData (MachineError fun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Methods

rnfMachineError fun → () #

NFData a ⇒ NFData (EvaluationResult a) 
Instance details

Defined in PlutusCore.Evaluation.Result

Methods

rnfEvaluationResult a → () #

Closed uni ⇒ NFData (SomeTypeIn uni) 
Instance details

Defined in Universe.Core

Methods

rnfSomeTypeIn uni → () #

AllBF NFData f CekMachineCostsBaseNFData (CekMachineCostsBase f) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts

Methods

rnfCekMachineCostsBase f → () #

NFData fun ⇒ NFData (CekExTally fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

rnfCekExTally fun → () #

NFData fun ⇒ NFData (TallyingSt fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

rnfTallyingSt fun → () #

NFData fun ⇒ NFData (ExBudgetCategory fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Methods

rnfExBudgetCategory fun → () #

NFData a ⇒ NFData (PostAligned a) 
Instance details

Defined in PlutusCore.Flat.Filler

Methods

rnfPostAligned a → () #

NFData a ⇒ NFData (PreAligned a) 
Instance details

Defined in PlutusCore.Flat.Filler

Methods

rnfPreAligned a → () #

NFData (Extended a) 
Instance details

Defined in PlutusLedgerApi.V1.Data.Interval

Methods

rnfExtended a → () #

NFData (Interval a) 
Instance details

Defined in PlutusLedgerApi.V1.Data.Interval

Methods

rnfInterval a → () #

NFData (LowerBound a) 
Instance details

Defined in PlutusLedgerApi.V1.Data.Interval

Methods

rnfLowerBound a → () #

NFData (UpperBound a) 
Instance details

Defined in PlutusLedgerApi.V1.Data.Interval

Methods

rnfUpperBound a → () #

NFData a ⇒ NFData (Extended a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Methods

rnfExtended a → () #

NFData a ⇒ NFData (Interval a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Methods

rnfInterval a → () #

NFData a ⇒ NFData (LowerBound a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Methods

rnfLowerBound a → () #

NFData a ⇒ NFData (UpperBound a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Methods

rnfUpperBound a → () #

NFData a ⇒ NFData (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnfAnnotDetails a → () #

NFData a ⇒ NFData (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnfDoc a → () #

NFData a ⇒ NFData (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

rnfArray a → () #

NFData (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnfPrimArray a → () #

NFData a ⇒ NFData (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

rnfSmallArray a → () #

NFData a ⇒ NFData (Leaf a) 
Instance details

Defined in Data.RAList.Tree.Internal

Methods

rnfLeaf a → () #

NFData g ⇒ NFData (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

rnfStateGen g → () #

NFData g ⇒ NFData (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnfAtomicGen g → () #

NFData g ⇒ NFData (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnfIOGen g → () #

NFData g ⇒ NFData (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnfSTGen g → () #

NFData g ⇒ NFData (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnfTGen g → () #

NFData a ⇒ NFData (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

rnfMaybe a → () #

NFData a ⇒ NFData (Edit a) 
Instance details

Defined in Data.TreeDiff.List

Methods

rnfEdit a → () #

NFData v ⇒ NFData (Val v) 
Instance details

Defined in Data.TreeDiff.OMap

Methods

rnf ∷ Val v → () #

NFData a ⇒ NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

rnfHashSet a → () #

NFData a ⇒ NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnfVector a → () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

rnfVector a → () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

rnfVector a → () #

NFData a ⇒ NFData (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

rnfVector a → () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnfVector a → () #

NFData a ⇒ NFData (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Methods

rnfDoc a → () #

NFData a ⇒ NFData (SimpleDoc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Methods

rnfSimpleDoc a → () #

NFData a ⇒ NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnfMaybe a → () #

NFData a ⇒ NFData (Solo a)

Since: deepseq-1.4.6.0

Instance details

Defined in Control.DeepSeq

Methods

rnfSolo a → () #

NFData a ⇒ NFData [a] 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ [a] → () #

(NFData e, NFData a) ⇒ NFData (Graph e a) 
Instance details

Defined in Algebra.Graph.Labelled

Methods

rnfGraph e a → () #

(NFData a, NFData e) ⇒ NFData (AdjacencyMap e a) 
Instance details

Defined in Algebra.Graph.Labelled.AdjacencyMap

Methods

rnfAdjacencyMap e a → () #

(NFData i, NFData r) ⇒ NFData (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

rnfIResult i r → () #

NFData (Fixed a)

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfFixed a → () #

(NFData a, NFData b) ⇒ NFData (Arg a b)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfArg a b → () #

(NFData a, NFData b) ⇒ NFData (Bimap a b) 
Instance details

Defined in Data.Bimap

Methods

rnfBimap a b → () #

NFData (SigDSIGN v) ⇒ NFData (SignedDSIGN v a) 
Instance details

Defined in Cardano.Crypto.DSIGN.Class

Methods

rnfSignedDSIGN v a → () #

NFData (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

rnfHash h a → () #

NFData (AbstractHash algo a) 
Instance details

Defined in Cardano.Crypto.Hashing

Methods

rnfAbstractHash algo a → () #

(NFData k, NFData v) ⇒ NFData (OMap k v) 
Instance details

Defined in Data.OMap.Strict

Methods

rnfOMap k v → () #

(NFData b, NFData a) ⇒ NFData (Annotated b a) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Annotated

Methods

rnfAnnotated b a → () #

NFData a ⇒ NFData (BoundedRatio b a) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnf ∷ BoundedRatio b a → () #

NFData a ⇒ NFData (Mismatch r a) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

rnfMismatch r a → () #

NFData (VoidEraRule rule era) 
Instance details

Defined in Cardano.Ledger.Core.Era

Methods

rnfVoidEraRule rule era → () #

(NFData k, NFData a) ⇒ NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnfMap k a → () #

(NFData a, NFData b) ⇒ NFData (Array a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnfArray a b → () #

(NFData a, NFData b) ⇒ NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnfEither a b → () #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfProxy a → () #

NFData (TypeRep a)

Since: deepseq-1.4.8.0

Instance details

Defined in Control.DeepSeq

Methods

rnfTypeRep a → () #

NFData (STRef s a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfSTRef s a → () #

(NFData (Token s), NFData e) ⇒ NFData (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnfParseError s e → () #

(NFData s, NFData (Token s), NFData e) ⇒ NFData (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnfParseErrorBundle s e → () #

(NFData s, NFData (ParseError s e)) ⇒ NFData (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

rnfState s e → () #

(NFData k, NFData a) ⇒ NFData (MonoidalHashMap k a) 
Instance details

Defined in Data.HashMap.Monoidal

Methods

rnfMonoidalHashMap k a → () #

(NFData k, NFData a) ⇒ NFData (MonoidalMap k a) 
Instance details

Defined in Data.Map.Monoidal

Methods

rnfMonoidalMap k a → () #

(Bounded fun, Enum fun) ⇒ NFData (BuiltinsRuntime fun val) 
Instance details

Defined in PlutusCore.Builtin.Runtime

Methods

rnfBuiltinsRuntime fun val → () #

(NFData structural, NFData operational) ⇒ NFData (EvaluationError structural operational) 
Instance details

Defined in PlutusCore.Evaluation.Error

Methods

rnfEvaluationError structural operational → () #

(NFData err, NFData cause) ⇒ NFData (ErrorWithCause err cause) 
Instance details

Defined in PlutusCore.Evaluation.ErrorWithCause

Methods

rnfErrorWithCause err cause → () #

(Closed uni, Everywhere uni NFData) ⇒ NFData (ValueOf uni a) 
Instance details

Defined in Universe.Core

Methods

rnfValueOf uni a → () #

(NFData ann, Closed uni) ⇒ NFData (TypeErrorExt uni ann) 
Instance details

Defined in PlutusIR.Error

Methods

rnfTypeErrorExt uni ann → () #

(NFData k, NFData v) ⇒ NFData (Map k v) 
Instance details

Defined in PlutusTx.AssocMap

Methods

rnfMap k v → () #

NFData (MutablePrimArray s a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnfMutablePrimArray s a → () #

NFData (f a) ⇒ NFData (Node f a) 
Instance details

Defined in Data.RAList.Tree.Internal

Methods

rnfNode f a → () #

(NFData a, NFData b) ⇒ NFData (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

rnfEither a b → () #

(NFData a, NFData b) ⇒ NFData (These a b) 
Instance details

Defined in Data.Strict.These

Methods

rnfThese a b → () #

(NFData a, NFData b) ⇒ NFData (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

rnfPair a b → () #

(NFData a, NFData b) ⇒ NFData (These a b)

Since: these-0.7.1

Instance details

Defined in Data.These

Methods

rnfThese a b → () #

(NFData k, NFData v) ⇒ NFData (OMap k v) 
Instance details

Defined in Data.TreeDiff.OMap

Methods

rnfOMap k v → () #

(NFData k, NFData v) ⇒ NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnfHashMap k v → () #

(NFData k, NFData v) ⇒ NFData (Leaf k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnfLeaf k v → () #

(NFData e, NFData a) ⇒ NFData (Validation e a) 
Instance details

Defined in Validation

Methods

rnfValidation e a → () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnfMVector s a → () #

(NFData a, NFData b) ⇒ NFData (a, b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a, b) → () #

NFData (a → b)

This instance is for convenience and consistency with seq. This assumes that WHNF is equivalent to NF for functions.

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a → b) → () #

NFData a ⇒ NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfConst a b → () #

NFData (a :~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a :~: b) → () #

(NFData ann, NFData tyname, Closed uni) ⇒ NFData (Type tyname uni ann) 
Instance details

Defined in PlutusCore.Core.Type

Methods

rnfType tyname uni ann → () #

(NFData fun, NFData ann, Closed uni, Everywhere uni NFData, NFData ParserError) ⇒ NFData (Error uni fun ann) 
Instance details

Defined in PlutusCore.Error

Methods

rnfError uni fun ann → () #

(NFData machineCosts, Bounded fun, Enum fun) ⇒ NFData (MachineParameters machineCosts fun val) 
Instance details

Defined in PlutusCore.Evaluation.Machine.MachineParameters

Methods

rnfMachineParameters machineCosts fun val → () #

(NFData machineCosts, Bounded fun, Enum fun) ⇒ NFData (MachineVariantParameters machineCosts fun val) 
Instance details

Defined in PlutusCore.Evaluation.Machine.MachineParameters

Methods

rnfMachineVariantParameters machineCosts fun val → () #

NFData b ⇒ NFData (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

rnfTagged s b → () #

(NFData (f a), NFData (g a), NFData a) ⇒ NFData (These1 f g a)

Available always

Since: these-1.2

Instance details

Defined in Data.Functor.These

Methods

rnfThese1 f g a → () #

(NFData (kv k), NFData (vv v)) ⇒ NFData (KVVector kv vv (k, v)) 
Instance details

Defined in Data.VMap.KVVector

Methods

rnfKVVector kv vv (k, v) → () #

(NFData a1, NFData a2, NFData a3) ⇒ NFData (a1, a2, a3) 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a1, a2, a3) → () #

(NFData (f a), NFData (g a)) ⇒ NFData (Product f g a)

Note: in deepseq-1.5.0.0 this instance's superclasses were changed.

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnfProduct f g a → () #

(NFData (f a), NFData (g a)) ⇒ NFData (Sum f g a)

Note: in deepseq-1.5.0.0 this instance's superclasses were changed.

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnfSum f g a → () #

NFData (a :~~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a :~~: b) → () #

(Closed uni, NFData ann, NFData term, NFData fun) ⇒ NFData (TypeError term uni fun ann) 
Instance details

Defined in PlutusCore.Error

Methods

rnfTypeError term uni fun ann → () #

(NFData name, Everywhere uni NFData, NFData fun, NFData ann, Closed uni) ⇒ NFData (Program name uni fun ann) 
Instance details

Defined in UntypedPlutusCore.Core.Type

Methods

rnfProgram name uni fun ann → () #

(NFData name, NFData fun, NFData ann, Everywhere uni NFData, Closed uni) ⇒ NFData (Term name uni fun ann) 
Instance details

Defined in UntypedPlutusCore.Core.Type

Methods

rnfTerm name uni fun ann → () #

(NFData (kv k), NFData (vv v)) ⇒ NFData (VMap kv vv k v) 
Instance details

Defined in Data.VMap

Methods

rnfVMap kv vv k v → () #

(NFData a1, NFData a2, NFData a3, NFData a4) ⇒ NFData (a1, a2, a3, a4) 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a1, a2, a3, a4) → () #

NFData (f (g a)) ⇒ NFData (Compose f g a)

Note: in deepseq-1.5.0.0 this instance's superclasses were changed.

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCompose f g a → () #

(NFData tyname, NFData name, Everywhere uni NFData, NFData fun, NFData ann, Closed uni) ⇒ NFData (Program tyname name uni fun ann) 
Instance details

Defined in PlutusCore.Core.Type

Methods

rnfProgram tyname name uni fun ann → () #

(NFData tyname, NFData name, NFData fun, NFData ann, Everywhere uni NFData, Closed uni) ⇒ NFData (Term tyname name uni fun ann) 
Instance details

Defined in PlutusCore.Core.Type

Methods

rnfTerm tyname name uni fun ann → () #

(NFData tyname, NFData name, Closed uni, Everywhere uni NFData, NFData fun, NFData ann) ⇒ NFData (NormCheckError tyname name uni fun ann) 
Instance details

Defined in PlutusCore.Error

Methods

rnfNormCheckError tyname name uni fun ann → () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5) ⇒ NFData (a1, a2, a3, a4, a5) 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a1, a2, a3, a4, a5) → () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6) ⇒ NFData (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a1, a2, a3, a4, a5, a6) → () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7) ⇒ NFData (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a1, a2, a3, a4, a5, a6, a7) → () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8) ⇒ NFData (a1, a2, a3, a4, a5, a6, a7, a8) 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a1, a2, a3, a4, a5, a6, a7, a8) → () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8, NFData a9) ⇒ NFData (a1, a2, a3, a4, a5, a6, a7, a8, a9) 
Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a1, a2, a3, a4, a5, a6, a7, a8, a9) → () #

runGen Source #

Arguments

Int

Seed

Int

Size

Gen a

Generator to run.

→ a 

Expr

class ToExpr a where Source #

toExpr converts a Haskell value into untyped Haskell-like syntax tree, Expr.

>>> toExpr ((1, Just 2) :: (Int, Maybe Int))
App "_\215_" [App "1" [],App "Just" [App "2" []]]

Minimal complete definition

Nothing

Methods

toExpr ∷ a → Expr Source #

default toExpr ∷ (Generic a, GToExpr (Rep a)) ⇒ a → Expr Source #

listToExpr ∷ [a] → Expr Source #

Instances

Instances details
ToExpr Key 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprKeyExpr Source #

listToExpr ∷ [Key] → Expr Source #

ToExpr Value 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprValueExpr Source #

listToExpr ∷ [Value] → Expr Source #

ToExpr ByteArray

Since: tree-diff-0.2.2

Instance details

Defined in Data.TreeDiff.Class

ToExpr ByteString
>>> traverse_ (print . prettyExpr . toExpr . BS8.pack) ["", "\n", "foo", "foo\n", "foo\nbar", "foo\nbar\n"]
""
"\n"
"foo"
"foo\n"
BS.concat ["foo\n", "bar"]
BS.concat ["foo\n", "bar\n"]
Instance details

Defined in Data.TreeDiff.Class

ToExpr ByteString
>>> traverse_ (print . prettyExpr . toExpr . LBS8.pack) ["", "\n", "foo", "foo\n", "foo\nbar", "foo\nbar\n"]
""
"\n"
"foo"
"foo\n"
LBS.concat ["foo\n", "bar"]
LBS.concat ["foo\n", "bar\n"]
Instance details

Defined in Data.TreeDiff.Class

ToExpr ShortByteString
>>> traverse_ (print . prettyExpr . toExpr . SBS.toShort . BS8.pack) ["", "\n", "foo", "foo\n", "foo\nbar", "foo\nbar\n"]
""
"\n"
"foo"
"foo\n"
mconcat ["foo\n", "bar"]
mconcat ["foo\n", "bar\n"]
Instance details

Defined in Data.TreeDiff.Class

ToExpr Version 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

ToExpr CBORBytes 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

ToExpr HexBytes 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

ToExpr Addr Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprAddrExpr Source #

listToExpr ∷ [Addr] → Expr Source #

ToExpr BootstrapAddress Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr CompactAddr Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr RewardAccount Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Withdrawals Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Anchor Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr BlocksMade Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr CertIx Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr DnsName Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Network Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr NonNegativeInterval Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Nonce Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprNonceExpr Source #

listToExpr ∷ [Nonce] → Expr Source #

ToExpr Port Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprPortExpr Source #

listToExpr ∷ [Port] → Expr Source #

ToExpr PositiveInterval Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr ProtVer Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr TxIx Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprTxIxExpr Source #

listToExpr ∷ [TxIx] → Expr Source #

ToExpr UnitInterval Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Url Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprUrlExpr Source #

listToExpr ∷ [Url] → Expr Source #

ToExpr Coin Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprCoinExpr Source #

listToExpr ∷ [Coin] → Expr Source #

ToExpr DeltaCoin Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr PoolCert Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Ptr Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprPtrExpr Source #

listToExpr ∷ [Ptr] → Expr Source #

ToExpr SlotNo32 Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr StakeReference Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr DRep Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprDRepExpr Source #

listToExpr ∷ [DRep] → Expr Source #

ToExpr DRepState Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr GenDelegPair Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr GenDelegs Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr ScriptHash Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr TxAuxDataHash Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr BootstrapWitness Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr ChainCode Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr CostModel Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr CostModels Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr ExUnits Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Prices Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Language Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr PlutusBinary Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr TxOutSource Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr CommitteeAuthorization Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr FutureGenDeleg Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr InstantaneousRewards Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr ChainAccountState Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr IndividualPoolStake Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr PoolDistr Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr SnapShot Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr SnapShots Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr Stake Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprStakeExpr Source #

listToExpr ∷ [Stake] → Expr Source #

ToExpr PoolMetadata Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr StakePoolParams Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr StakePoolRelay Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr StakePoolState Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr TxId Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprTxIdExpr Source #

listToExpr ∷ [TxId] → Expr Source #

ToExpr TxIn Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprTxInExpr Source #

listToExpr ∷ [TxIn] → Expr Source #

ToExpr BlockNo 
Instance details

Defined in Test.Cardano.Slotting.TreeDiff

ToExpr EpochInterval Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr EpochNo 
Instance details

Defined in Test.Cardano.Slotting.TreeDiff

ToExpr EpochSize 
Instance details

Defined in Test.Cardano.Slotting.TreeDiff

ToExpr SlotNo 
Instance details

Defined in Test.Cardano.Slotting.TreeDiff

ToExpr Term 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

Methods

toExprTermExpr Source #

listToExpr ∷ [Term] → Expr Source #

ToExpr IntSet 
Instance details

Defined in Data.TreeDiff.Class

ToExpr Assign 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr CDDL 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprCDDLExpr Source #

listToExpr ∷ [CDDL] → Expr Source #

ToExpr GenericArg 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr GenericParam 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr Group 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprGroupExpr Source #

listToExpr ∷ [Group] → Expr Source #

ToExpr GroupEntry 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr GroupEntryVariant 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr GrpChoice 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr MemberKey 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr Name 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprNameExpr Source #

listToExpr ∷ [Name] → Expr Source #

ToExpr OccurrenceIndicator 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr RangeBound 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr Rule 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprRuleExpr Source #

listToExpr ∷ [Rule] → Expr Source #

ToExpr TopLevel 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr TyOp 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprTyOpExpr Source #

listToExpr ∷ [TyOp] → Expr Source #

ToExpr Type0 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprType0Expr Source #

listToExpr ∷ [Type0] → Expr Source #

ToExpr Type1 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprType1Expr Source #

listToExpr ∷ [Type1] → Expr Source #

ToExpr Type2 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprType2Expr Source #

listToExpr ∷ [Type2] → Expr Source #

ToExpr TypeOrGroup 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr Value 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

Methods

toExprValueExpr Source #

listToExpr ∷ [Value] → Expr Source #

ToExpr ValueVariant 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL

ToExpr CtlOp 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.CtlOp

Methods

toExprCtlOpExpr Source #

listToExpr ∷ [CtlOp] → Expr Source #

ToExpr Comment 
Instance details

Defined in Codec.CBOR.Cuddle.Comments

ToExpr Void 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprVoidExpr Source #

listToExpr ∷ [Void] → Expr Source #

ToExpr Int16 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprInt16Expr Source #

listToExpr ∷ [Int16] → Expr Source #

ToExpr Int32 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprInt32Expr Source #

listToExpr ∷ [Int32] → Expr Source #

ToExpr Int64 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprInt64Expr Source #

listToExpr ∷ [Int64] → Expr Source #

ToExpr Int8 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprInt8Expr Source #

listToExpr ∷ [Int8] → Expr Source #

ToExpr Word16 
Instance details

Defined in Data.TreeDiff.Class

ToExpr Word32 
Instance details

Defined in Data.TreeDiff.Class

ToExpr Word64 
Instance details

Defined in Data.TreeDiff.Class

ToExpr Word8 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprWord8Expr Source #

listToExpr ∷ [Word8] → Expr Source #

ToExpr Ordering 
Instance details

Defined in Data.TreeDiff.Class

ToExpr IPv4 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

Methods

toExprIPv4Expr Source #

listToExpr ∷ [IPv4] → Expr Source #

ToExpr IPv6 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

Methods

toExprIPv6Expr Source #

listToExpr ∷ [IPv6] → Expr Source #

ToExpr Scientific
>>> prettyExpr $ toExpr (123.456 :: Scientific)
scientific 123456 `-3`
Instance details

Defined in Data.TreeDiff.Class

ToExpr Text
>>> traverse_ (print . prettyExpr . toExpr . T.pack) ["", "\n", "foo", "foo\n", "foo\nbar", "foo\nbar\n"]
""
"\n"
"foo"
"foo\n"
T.concat ["foo\n", "bar"]
T.concat ["foo\n", "bar\n"]
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprTextExpr Source #

listToExpr ∷ [Text] → Expr Source #

ToExpr Text
>>> traverse_ (print . prettyExpr . toExpr . LT.pack) ["", "\n", "foo", "foo\n", "foo\nbar", "foo\nbar\n"]
""
"\n"
"foo"
"foo\n"
LT.concat ["foo\n", "bar"]
LT.concat ["foo\n", "bar\n"]
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprTextExpr Source #

listToExpr ∷ [Text] → Expr Source #

ToExpr Day
>>> prettyExpr $ toExpr $ ModifiedJulianDay 58014
Day "2017-09-18"
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprDayExpr Source #

listToExpr ∷ [Day] → Expr Source #

ToExpr UTCTime 
Instance details

Defined in Data.TreeDiff.Class

ToExpr Expr 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprExprExpr Source #

listToExpr ∷ [Expr] → Expr Source #

ToExpr UUID
>>> prettyExpr $ toExpr UUID.nil
UUID "00000000-0000-0000-0000-000000000000"
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprUUIDExpr Source #

listToExpr ∷ [UUID] → Expr Source #

ToExpr Integer 
Instance details

Defined in Data.TreeDiff.Class

ToExpr Natural 
Instance details

Defined in Data.TreeDiff.Class

ToExpr () 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExpr ∷ () → Expr Source #

listToExpr ∷ [()] → Expr Source #

ToExpr Bool 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprBoolExpr Source #

listToExpr ∷ [Bool] → Expr Source #

ToExpr Char
>>> prettyExpr $ toExpr 'a'
'a'
>>> prettyExpr $ toExpr "Hello world"
"Hello world"
>>> prettyExpr $ toExpr "Hello\nworld"
concat ["Hello\n", "world"]
>>> traverse_ (print . prettyExpr . toExpr) ["", "\n", "foo", "foo\n", "foo\nbar", "foo\nbar\n"]
""
"\n"
"foo"
"foo\n"
concat ["foo\n", "bar"]
concat ["foo\n", "bar\n"]
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprCharExpr Source #

listToExpr ∷ [Char] → Expr Source #

ToExpr Double 
Instance details

Defined in Data.TreeDiff.Class

ToExpr Float 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprFloatExpr Source #

listToExpr ∷ [Float] → Expr Source #

ToExpr Int 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprIntExpr Source #

listToExpr ∷ [Int] → Expr Source #

ToExpr Word 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprWordExpr Source #

listToExpr ∷ [Word] → Expr Source #

ToExpr a ⇒ ToExpr (KeyMap a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprKeyMap a → Expr Source #

listToExpr ∷ [KeyMap a] → Expr Source #

ToExpr a ⇒ ToExpr (First a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprFirst a → Expr Source #

listToExpr ∷ [First a] → Expr Source #

ToExpr a ⇒ ToExpr (Last a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprLast a → Expr Source #

listToExpr ∷ [Last a] → Expr Source #

ToExpr a ⇒ ToExpr (Max a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprMax a → Expr Source #

listToExpr ∷ [Max a] → Expr Source #

ToExpr a ⇒ ToExpr (Min a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprMin a → Expr Source #

listToExpr ∷ [Min a] → Expr Source #

ToExpr a ⇒ ToExpr (Sized a) 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

Methods

toExprSized a → Expr Source #

listToExpr ∷ [Sized a] → Expr Source #

ToExpr a ⇒ ToExpr (NonZero a) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprNonZero a → Expr Source #

listToExpr ∷ [NonZero a] → Expr Source #

ToExpr (CompactForm Coin) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr (CompactForm DeltaCoin) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr (PParamsHKD Identity era) ⇒ ToExpr (PParams era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprPParams era → Expr Source #

listToExpr ∷ [PParams era] → Expr Source #

ToExpr (PParamsHKD StrictMaybe era) ⇒ ToExpr (PParamsUpdate era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr (Credential keyrole) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprCredential keyrole → Expr Source #

listToExpr ∷ [Credential keyrole] → Expr Source #

ToExpr (NoUpdate a) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprNoUpdate a → Expr Source #

listToExpr ∷ [NoUpdate a] → Expr Source #

ToExpr (KeyHash keyrole) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprKeyHash keyrole → Expr Source #

listToExpr ∷ [KeyHash keyrole] → Expr Source #

ToExpr (SafeHash i) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprSafeHash i → Expr Source #

listToExpr ∷ [SafeHash i] → Expr Source #

ToExpr (VRFVerKeyHash keyrole) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprVRFVerKeyHash keyrole → Expr Source #

listToExpr ∷ [VRFVerKeyHash keyrole] → Expr Source #

ToExpr (VKey r) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprVKey r → Expr Source #

listToExpr ∷ [VKey r] → Expr Source #

ToExpr (WitVKey kr) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprWitVKey kr → Expr Source #

listToExpr ∷ [WitVKey kr] → Expr Source #

ToExpr t ⇒ ToExpr (MemoBytes t) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr (BinaryData era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprBinaryData era → Expr Source #

listToExpr ∷ [BinaryData era] → Expr Source #

ToExpr (Data era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprData era → Expr Source #

listToExpr ∷ [Data era] → Expr Source #

ToExpr (Datum era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprDatum era → Expr Source #

listToExpr ∷ [Datum era] → Expr Source #

ToExpr (PlutusData era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprPlutusData era → Expr Source #

listToExpr ∷ [PlutusData era] → Expr Source #

ToExpr (Plutus l) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprPlutus l → Expr Source #

listToExpr ∷ [Plutus l] → Expr Source #

ToExpr (CommitteeState era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr (Accounts era) ⇒ ToExpr (DState era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprDState era → Expr Source #

listToExpr ∷ [DState era] → Expr Source #

ToExpr (PState era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprPState era → Expr Source #

listToExpr ∷ [PState era] → Expr Source #

(Era era, ToExpr (Script era)) ⇒ ToExpr (ScriptsProvided era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

ToExpr (TxOut era) ⇒ ToExpr (UTxO era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprUTxO era → Expr Source #

listToExpr ∷ [UTxO era] → Expr Source #

ToExpr (KeyPair r) Source # 
Instance details

Defined in Test.Cardano.Ledger.Core.KeyPair

Methods

toExprKeyPair r → Expr Source #

listToExpr ∷ [KeyPair r] → Expr Source #

ToExpr x ⇒ ToExpr (WithOrigin x) 
Instance details

Defined in Test.Cardano.Slotting.TreeDiff

ToExpr a ⇒ ToExpr (StrictMaybe a) 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

ToExpr a ⇒ ToExpr (StrictSeq a) 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

ToExpr v ⇒ ToExpr (IntMap v) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprIntMap v → Expr Source #

listToExpr ∷ [IntMap v] → Expr Source #

ToExpr v ⇒ ToExpr (Seq v) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprSeq v → Expr Source #

listToExpr ∷ [Seq v] → Expr Source #

ToExpr k ⇒ ToExpr (Set k) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprSet k → Expr Source #

listToExpr ∷ [Set k] → Expr Source #

ToExpr a ⇒ ToExpr (Tree a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprTree a → Expr Source #

listToExpr ∷ [Tree a] → Expr Source #

ToExpr a ⇒ ToExpr (NonEmpty a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprNonEmpty a → Expr Source #

listToExpr ∷ [NonEmpty a] → Expr Source #

ToExpr a ⇒ ToExpr (Identity a)
>>> prettyExpr $ toExpr $ Identity 'a'
Identity 'a'
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprIdentity a → Expr Source #

listToExpr ∷ [Identity a] → Expr Source #

ToExpr a ⇒ ToExpr (First a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprFirst a → Expr Source #

listToExpr ∷ [First a] → Expr Source #

ToExpr a ⇒ ToExpr (Last a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprLast a → Expr Source #

listToExpr ∷ [Last a] → Expr Source #

ToExpr a ⇒ ToExpr (Dual a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprDual a → Expr Source #

listToExpr ∷ [Dual a] → Expr Source #

ToExpr a ⇒ ToExpr (Product a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprProduct a → Expr Source #

listToExpr ∷ [Product a] → Expr Source #

ToExpr a ⇒ ToExpr (Sum a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprSum a → Expr Source #

listToExpr ∷ [Sum a] → Expr Source #

ToExpr a ⇒ ToExpr (ZipList a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprZipList a → Expr Source #

listToExpr ∷ [ZipList a] → Expr Source #

(ToExpr a, Integral a) ⇒ ToExpr (Ratio a)
>>> prettyExpr $ toExpr (3 % 12 :: Rational)
_%_ 1 4
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprRatio a → Expr Source #

listToExpr ∷ [Ratio a] → Expr Source #

ToExpr a ⇒ ToExpr (Hashed a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprHashed a → Expr Source #

listToExpr ∷ [Hashed a] → Expr Source #

ToExpr a ⇒ ToExpr (Maybe a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprMaybe a → Expr Source #

listToExpr ∷ [Maybe a] → Expr Source #

ToExpr k ⇒ ToExpr (HashSet k) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprHashSet k → Expr Source #

listToExpr ∷ [HashSet k] → Expr Source #

ToExpr a ⇒ ToExpr (Vector a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprVector a → Expr Source #

listToExpr ∷ [Vector a] → Expr Source #

(ToExpr a, Prim a) ⇒ ToExpr (Vector a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprVector a → Expr Source #

listToExpr ∷ [Vector a] → Expr Source #

(ToExpr a, Storable a) ⇒ ToExpr (Vector a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprVector a → Expr Source #

listToExpr ∷ [Vector a] → Expr Source #

(ToExpr a, Unbox a) ⇒ ToExpr (Vector a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprVector a → Expr Source #

listToExpr ∷ [Vector a] → Expr Source #

ToExpr a ⇒ ToExpr (Maybe a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprMaybe a → Expr Source #

listToExpr ∷ [Maybe a] → Expr Source #

ToExpr a ⇒ ToExpr [a] 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExpr ∷ [a] → Expr Source #

listToExpr ∷ [[a]] → Expr Source #

HasResolution a ⇒ ToExpr (Fixed a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprFixed a → Expr Source #

listToExpr ∷ [Fixed a] → Expr Source #

DSIGNAlgorithm c ⇒ ToExpr (SignedDSIGN c index) 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

Methods

toExprSignedDSIGN c index → Expr Source #

listToExpr ∷ [SignedDSIGN c index] → Expr Source #

ToExpr (Hash c index) 
Instance details

Defined in Test.Cardano.Ledger.Binary.TreeDiff

Methods

toExprHash c index → Expr Source #

listToExpr ∷ [Hash c index] → Expr Source #

ToExpr a ⇒ ToExpr (Mismatch r a) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprMismatch r a → Expr Source #

listToExpr ∷ [Mismatch r a] → Expr Source #

ToExpr (VoidEraRule rule era) Source # 
Instance details

Defined in Test.Cardano.Ledger.TreeDiff

Methods

toExprVoidEraRule rule era → Expr Source #

listToExpr ∷ [VoidEraRule rule era] → Expr Source #

(ToExpr k, ToExpr v) ⇒ ToExpr (Map k v) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprMap k v → Expr Source #

listToExpr ∷ [Map k v] → Expr Source #

(ToExpr a, ToExpr b) ⇒ ToExpr (Either a b) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprEither a b → Expr Source #

listToExpr ∷ [Either a b] → Expr Source #

ToExpr (Proxy a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprProxy a → Expr Source #

listToExpr ∷ [Proxy a] → Expr Source #

(ToExpr a, ToExpr b) ⇒ ToExpr (Either a b) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprEither a b → Expr Source #

listToExpr ∷ [Either a b] → Expr Source #

(ToExpr a, ToExpr b) ⇒ ToExpr (These a b) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprThese a b → Expr Source #

listToExpr ∷ [These a b] → Expr Source #

(ToExpr a, ToExpr b) ⇒ ToExpr (Pair a b) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprPair a b → Expr Source #

listToExpr ∷ [Pair a b] → Expr Source #

(ToExpr a, ToExpr b) ⇒ ToExpr (These a b) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprThese a b → Expr Source #

listToExpr ∷ [These a b] → Expr Source #

(ToExpr k, ToExpr v) ⇒ ToExpr (HashMap k v) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprHashMap k v → Expr Source #

listToExpr ∷ [HashMap k v] → Expr Source #

(ToExpr a, ToExpr b) ⇒ ToExpr (a, b) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExpr ∷ (a, b) → Expr Source #

listToExpr ∷ [(a, b)] → Expr Source #

ToExpr a ⇒ ToExpr (Const a b) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprConst a b → Expr Source #

listToExpr ∷ [Const a b] → Expr Source #

ToExpr a ⇒ ToExpr (Tagged t a) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExprTagged t a → Expr Source #

listToExpr ∷ [Tagged t a] → Expr Source #

(ToExpr a, ToExpr b, ToExpr c) ⇒ ToExpr (a, b, c) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExpr ∷ (a, b, c) → Expr Source #

listToExpr ∷ [(a, b, c)] → Expr Source #

(Vector kv k, Vector vv v, ToExpr k, ToExpr v) ⇒ ToExpr (VMap kv vv k v) 
Instance details

Defined in Test.Data.VMap.TreeDiff

Methods

toExprVMap kv vv k v → Expr Source #

listToExpr ∷ [VMap kv vv k v] → Expr Source #

(ToExpr a, ToExpr b, ToExpr c, ToExpr d) ⇒ ToExpr (a, b, c, d) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExpr ∷ (a, b, c, d) → Expr Source #

listToExpr ∷ [(a, b, c, d)] → Expr Source #

(ToExpr a, ToExpr b, ToExpr c, ToExpr d, ToExpr e) ⇒ ToExpr (a, b, c, d, e) 
Instance details

Defined in Data.TreeDiff.Class

Methods

toExpr ∷ (a, b, c, d, e) → Expr Source #

listToExpr ∷ [(a, b, c, d, e)] → Expr Source #

showExprToExpr a ⇒ a → String Source #

diffExprToExpr a ⇒ a → a → Doc AnsiStyle Source #

diffExprStringToExpr a ⇒ a → a → String Source #

diffExprCompactToExpr a ⇒ a → a → Doc AnsiStyle Source #

Expectations

assertBool Source #

Arguments

HasCallStack 
String

The message that is displayed if the assertion fails

Bool

The condition

Assertion 

Asserts that the specified condition holds.

assertFailure Source #

Arguments

HasCallStack 
String

A message that is displayed with the assertion failure

IO a 

Unconditionally signals that a failure has occurred.

assertColorFailureHasCallStackStringIO a Source #

Similar to assertFailure, except hspec will not interfer with any escape sequences that indicate color output.

Non-standard expectations

shouldBeExpr ∷ (HasCallStack, ToExpr a, Eq a) ⇒ a → a → IO () infix 1 Source #

shouldBeRight ∷ (HasCallStack, Show a, Show b, Eq b) ⇒ Either a b → b → Expectation infix 1 Source #

Same as shouldBe, except it checks that the value is Right

shouldBeLeft ∷ (HasCallStack, Show a, Eq a, Show b) ⇒ Either a b → a → Expectation infix 1 Source #

Same as shouldBe, except it checks that the value is Left

shouldBeRightExpr ∷ (HasCallStack, ToExpr a, Eq b, ToExpr b) ⇒ Either a b → b → Expectation infix 1 Source #

Same as shouldBeExpr, except it checks that the value is Right

shouldBeLeftExpr ∷ (HasCallStack, ToExpr a, ToExpr b, Eq a) ⇒ Either a b → a → Expectation infix 1 Source #

Same as shouldBeExpr, except it checks that the value is Left

expectRight ∷ (HasCallStack, Show a) ⇒ Either a b → IO b Source #

Return value on the Right and fail otherwise.

Difference from shouldSatisfy action isRight in that expectRight will force the content of the Right to WHNF and return it. This expectation will also show the content of the Left when expectation fails.

expectRightDeep ∷ (HasCallStack, Show a, NFData b) ⇒ Either a b → IO b Source #

Same as expectRight, but also evaluate the returned value to NF

expectRightDeep_ ∷ (HasCallStack, Show a, NFData b) ⇒ Either a b → IO () Source #

Same as expectRightDeep, but discards the result

expectRightExpr ∷ (HasCallStack, ToExpr a) ⇒ Either a b → IO b Source #

Same as expectRight, but use ToExpr instead of Show

expectRightDeepExpr ∷ (HasCallStack, ToExpr a, NFData b) ⇒ Either a b → IO b Source #

Same as expectRightDeep, but use ToExpr instead of Show

expectRightDeepExpr_ ∷ (HasCallStack, ToExpr a, NFData b) ⇒ Either a b → IO () Source #

Same as expectRightDeepExpr, but discard the contents of Right

expectLeft ∷ (HasCallStack, Show b) ⇒ Either a b → IO a Source #

Return value on the Left an fail otherwise

Difference from shouldSatisfy action isLeft in that expectLeft will force the content of the Left to WHNF and and return it. This expectation will also show the content of the Right when expectation fails.

expectLeftExpr ∷ (HasCallStack, ToExpr b) ⇒ Either a b → IO a Source #

Same as expectLeft, but use ToExpr instead of Show

expectLeftDeep ∷ (HasCallStack, NFData a, Show b) ⇒ Either a b → IO a Source #

Same as expectLeft, but also evaluate the returned value to NF

expectLeftDeep_ ∷ (HasCallStack, NFData a, Show b) ⇒ Either a b → IO () Source #

Same as expectLeftDeep, but discards the result

expectLeftDeepExpr ∷ (HasCallStack, ToExpr b, NFData a) ⇒ Either a b → IO a Source #

Same as expectLeftDeep, but use ToExpr instead of Show

expectLeftDeepExpr_ ∷ (HasCallStack, ToExpr b, NFData a) ⇒ Either a b → IO () Source #

Same as expectLeftDeepExpr, but discard the contents of Left

expectJustHasCallStackMaybe a → IO a Source #

Return value from the Just an fail otherwise

Difference from shouldSatisfy action isJust in that expectJust will force the content of the Just to WHNF and it will also return it.

expectJustDeep ∷ (HasCallStack, NFData a) ⇒ Maybe a → IO a Source #

Same as expectJust, but will force the value to NF

expectJustDeep_ ∷ (HasCallStack, NFData a) ⇒ Maybe a → IO () Source #

Same as expectJustDeep, but will discard the forced contents of Just

expectNothing ∷ (HasCallStack, Show a) ⇒ Maybe a → IO () Source #

Same as shouldSatisfy action isNothing

Miscellanous helpers

tracedDiscardString → a Source #

Same as discard but outputs a debug trace message