Agda-2.4.2.4: A dependently typed functional programming language and proof assistant

Safe HaskellNone
LanguageHaskell98

Agda.TypeChecking.Test.Generators

Synopsis

Documentation

data TermConfiguration Source

Constructors

TermConf 

Fields

tcDefinedNames :: [QName]
 
tcConstructorNames :: [QName]
 
tcProjectionNames :: [QName]
 
tcFreeVariables :: [Nat]
 
tcLiterals :: UseLiterals
 
tcFrequencies :: Frequencies
 
tcFixSize :: Maybe Int

Maximum size of the generated element. When Nothing this value is initialized from the size parameter.

tcIsType :: Bool

When this is true no lambdas, literals, or constructors are generated

data TermFreqs Source

Constructors

TermFreqs 

Fields

varFreq :: Int
 
defFreq :: Int
 
conFreq :: Int
 
litFreq :: Int
 
sortFreq :: Int
 
lamFreq :: Int
 
piFreq :: Int
 
funFreq :: Int
 

Instances

data ElimFreqs Source

Constructors

ElimFreqs 

Fields

applyFreq :: Int
 
projFreq :: Int
 

Instances

data SortFreqs Source

Constructors

SortFreqs 

Fields

setFreqs :: [Int]
 
propFreq :: Int
 

Instances

newtype YesType a Source

Constructors

YesType 

Fields

unYesType :: a
 

Instances

ShrinkC a b => ShrinkC (YesType a) b Source 

newtype NoType a Source

Constructors

NoType 

Fields

unNoType :: a
 

Instances

ShrinkC a b => ShrinkC (NoType a) b Source 

newtype VarName Source

Constructors

VarName 

Fields

unVarName :: Nat
 

newtype DefName Source

Constructors

DefName 

Fields

unDefName :: QName
 

newtype ConName Source

Constructors

ConName 

Fields

unConName :: ConHead
 

newtype ProjName Source

Constructors

ProjName 

Fields

unProjName :: QName
 

Instances

newtype SizedList a Source

Constructors

SizedList 

Fields

unSizedList :: [a]
 

Instances

fixSize :: TermConfiguration -> Gen a -> Gen a Source

genConf :: Gen TermConfiguration Source

Only generates default configurations. Names and free variables varies.

killAbs :: KillVar a => Abs a -> a Source

prop_wellScopedVars :: TermConfiguration -> Property Source

Check that the generated terms don't have any out of scope variables.