Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell98 |
Synopsis
- data Config = Config {
- srcFile :: FilePath
- cores :: Maybe Int
- minPartSize :: Int
- maxPartSize :: Int
- solver :: SMTSolver
- linear :: Bool
- stringTheory :: Bool
- defunction :: Bool
- allowHO :: Bool
- allowHOqs :: Bool
- eliminate :: Eliminate
- scrape :: Scrape
- elimBound :: Maybe Int
- smtTimeout :: Maybe Int
- elimStats :: Bool
- solverStats :: Bool
- metadata :: Bool
- stats :: Bool
- parts :: Bool
- save :: Bool
- minimize :: Bool
- minimizeQs :: Bool
- minimizeKs :: Bool
- minimalSol :: Bool
- etaElim :: Bool
- gradual :: Bool
- ginteractive :: Bool
- autoKuts :: Bool
- nonLinCuts :: Bool
- noslice :: Bool
- rewriteAxioms :: Bool
- pleWithUndecidedGuards :: Bool
- interpreter :: Bool
- oldPLE :: Bool
- noIncrPle :: Bool
- noEnvironmentReduction :: Bool
- inlineANFBindings :: Bool
- checkCstr :: [Integer]
- extensionality :: Bool
- rwTerminationCheck :: Bool
- stdin :: Bool
- json :: Bool
- noLazyPLE :: Bool
- fuel :: Maybe Int
- restOrdering :: String
- defConfig :: Config
- withPragmas :: Config -> [String] -> IO Config
- getOpts :: IO Config
- data SMTSolver
- data RESTOrdering
- restOC :: Config -> RESTOrdering
- data Eliminate
- = None
- | Some
- | All
- | Horn
- | Existentials
- useElim :: Config -> Bool
- data Scrape
- defaultMinPartSize :: Int
- defaultMaxPartSize :: Int
- multicore :: Config -> Bool
- queryFile :: Ext -> Config -> FilePath
Documentation
Config | |
|
Instances
SMT Solver options
Instances
Data SMTSolver Source # | |
Defined in Language.Fixpoint.Types.Config gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SMTSolver -> c SMTSolver # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SMTSolver # toConstr :: SMTSolver -> Constr # dataTypeOf :: SMTSolver -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SMTSolver) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SMTSolver) # gmapT :: (forall b. Data b => b -> b) -> SMTSolver -> SMTSolver # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SMTSolver -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SMTSolver -> r # gmapQ :: (forall d. Data d => d -> u) -> SMTSolver -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SMTSolver -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SMTSolver -> m SMTSolver # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SMTSolver -> m SMTSolver # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SMTSolver -> m SMTSolver # | |
Generic SMTSolver Source # | |
Show SMTSolver Source # | |
Default SMTSolver Source # | |
Defined in Language.Fixpoint.Types.Config | |
NFData SMTSolver Source # | |
Defined in Language.Fixpoint.Types.Config | |
Eq SMTSolver Source # | |
Store SMTSolver Source # | |
type Rep SMTSolver Source # | |
Defined in Language.Fixpoint.Types.Config type Rep SMTSolver = D1 ('MetaData "SMTSolver" "Language.Fixpoint.Types.Config" "liquid-fixpoint-0.9.2.5-8VOJ4a5jXPy7nyhLFTxkOW" 'False) ((C1 ('MetaCons "Z3" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Z3mem" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Cvc4" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Mathsat" 'PrefixI 'False) (U1 :: Type -> Type))) |
data RESTOrdering Source #
Instances
restOC :: Config -> RESTOrdering Source #
Eliminate options
Eliminate describes the number of KVars to eliminate: None = use PA/Quals for ALL k-vars, i.e. no eliminate Some = use PA/Quals for CUT k-vars, i.e. eliminate non-cuts All = eliminate ALL k-vars, solve cut-vars to TRUE Horn = eliminate kvars using the Horn solver Existentials = eliminate kvars and existentials
Instances
Data Eliminate Source # | |
Defined in Language.Fixpoint.Types.Config gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Eliminate -> c Eliminate # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Eliminate # toConstr :: Eliminate -> Constr # dataTypeOf :: Eliminate -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Eliminate) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Eliminate) # gmapT :: (forall b. Data b => b -> b) -> Eliminate -> Eliminate # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Eliminate -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Eliminate -> r # gmapQ :: (forall d. Data d => d -> u) -> Eliminate -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Eliminate -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Eliminate -> m Eliminate # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Eliminate -> m Eliminate # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Eliminate -> m Eliminate # | |
Generic Eliminate Source # | |
Show Eliminate Source # | |
Serialize Eliminate Source # | |
Default Eliminate Source # | |
Defined in Language.Fixpoint.Types.Config | |
NFData Eliminate Source # | |
Defined in Language.Fixpoint.Types.Config | |
Eq Eliminate Source # | |
Store Eliminate Source # | |
type Rep Eliminate Source # | |
Defined in Language.Fixpoint.Types.Config type Rep Eliminate = D1 ('MetaData "Eliminate" "Language.Fixpoint.Types.Config" "liquid-fixpoint-0.9.2.5-8VOJ4a5jXPy7nyhLFTxkOW" 'False) ((C1 ('MetaCons "None" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Some" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "All" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Horn" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Existentials" 'PrefixI 'False) (U1 :: Type -> Type)))) |
Scrape options
Scrape
describes which (Horn) constraints to scrape qualifiers from
None = do not scrape, only use the supplied qualifiers
Head = scrape only from the constraint heads (i.e. "rhs")
All = scrape all concrete predicates (i.e. "rhs" + "lhs")
Instances
Data Scrape Source # | |
Defined in Language.Fixpoint.Types.Config gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Scrape -> c Scrape # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Scrape # toConstr :: Scrape -> Constr # dataTypeOf :: Scrape -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Scrape) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Scrape) # gmapT :: (forall b. Data b => b -> b) -> Scrape -> Scrape # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Scrape -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Scrape -> r # gmapQ :: (forall d. Data d => d -> u) -> Scrape -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Scrape -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Scrape -> m Scrape # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Scrape -> m Scrape # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Scrape -> m Scrape # | |
Generic Scrape Source # | |
Show Scrape Source # | |
Serialize Scrape Source # | |
Default Scrape Source # | |
Defined in Language.Fixpoint.Types.Config | |
NFData Scrape Source # | |
Defined in Language.Fixpoint.Types.Config | |
Eq Scrape Source # | |
Store Scrape Source # | |
type Rep Scrape Source # | |
Defined in Language.Fixpoint.Types.Config type Rep Scrape = D1 ('MetaData "Scrape" "Language.Fixpoint.Types.Config" "liquid-fixpoint-0.9.2.5-8VOJ4a5jXPy7nyhLFTxkOW" 'False) (C1 ('MetaCons "No" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Head" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Both" 'PrefixI 'False) (U1 :: Type -> Type))) |
parallel solving options
defaultMinPartSize :: Int Source #
Configuration Options -----------------------------------------------------