{-# LANGUAGE ScopedTypeVariables #-}
{-# OPTIONS_GHC -Wall -Werror #-}
module Data.SBV.Provers.Z3(z3) where
import Data.SBV.Core.Data
import Data.SBV.SMT.SMT
z3 :: SMTSolver
z3 = SMTSolver {
name = Z3
, executable = "z3"
, preprocess = id
, options = modConfig ["-nw", "-in", "-smt2"]
, engine = standardEngine "SBV_Z3" "SBV_Z3_OPTIONS"
, capabilities = SolverCapabilities {
supportsQuantifiers = True
, supportsUninterpretedSorts = True
, supportsUnboundedInts = True
, supportsReals = True
, supportsApproxReals = True
, supportsIEEE754 = True
, supportsSets = True
, supportsOptimization = True
, supportsPseudoBooleans = True
, supportsCustomQueries = True
, supportsGlobalDecls = True
, supportsDataTypes = True
, supportsFlattenedModels = Just [ "(set-option :pp.max_depth 4294967295)"
, "(set-option :pp.min_alias_size 4294967295)"
, "(set-option :model.inline_def true )"
]
}
}
where modConfig :: [String] -> SMTConfig -> [String]
modConfig opts _cfg = opts