{-# LANGUAGE ScopedTypeVariables #-}
module Data.SBV.Provers.Yices(yices) where
import Data.SBV.Core.Data
import Data.SBV.SMT.SMT
yices :: SMTSolver
yices = SMTSolver {
name = Yices
, executable = "yices-smt2"
, preprocess = id
, options = const ["--incremental"]
, engine = standardEngine "SBV_YICES" "SBV_YICES_OPTIONS"
, capabilities = SolverCapabilities {
supportsQuantifiers = False
, supportsUninterpretedSorts = True
, supportsUnboundedInts = True
, supportsReals = True
, supportsApproxReals = False
, supportsIEEE754 = False
, supportsSets = False
, supportsOptimization = False
, supportsPseudoBooleans = False
, supportsCustomQueries = True
, supportsGlobalDecls = False
, supportsDataTypes = False
, supportsFlattenedModels = Nothing
}
}