module Language.Hasmtlib.Solver.Bitwuzla where
import SMTLIB.Backends.Process
import Language.Hasmtlib.Type.Solver
bitwuzla :: SolverConfig s
bitwuzla :: forall s. SolverConfig s
bitwuzla = Config -> Maybe Int -> Maybe (Debugger s) -> SolverConfig s
forall s.
Config -> Maybe Int -> Maybe (Debugger s) -> SolverConfig s
SolverConfig
(Config
defaultConfig { exe = "bitwuzla", args = [] })
Maybe Int
forall a. Maybe a
Nothing
Maybe (Debugger s)
forall a. Maybe a
Nothing
bitwuzlaKissat :: SolverConfig s
bitwuzlaKissat :: forall s. SolverConfig s
bitwuzlaKissat = Config -> Maybe Int -> Maybe (Debugger s) -> SolverConfig s
forall s.
Config -> Maybe Int -> Maybe (Debugger s) -> SolverConfig s
SolverConfig
(Config
defaultConfig { exe = "bitwuzla", args = ["--sat-solver=kissat"] })
Maybe Int
forall a. Maybe a
Nothing
Maybe (Debugger s)
forall a. Maybe a
Nothing