module Language.Hasmtlib.Solver.Yices where

import SMTLIB.Backends.Process
import Language.Hasmtlib.Type.Solver

-- | A 'SolverConfig' for Yices.
--   Requires binary @yices-smt2@ to be in path.
yices :: SolverConfig s
yices :: forall s. SolverConfig s
yices = Config -> Maybe Int -> Maybe (Debugger s) -> SolverConfig s
forall s.
Config -> Maybe Int -> Maybe (Debugger s) -> SolverConfig s
SolverConfig
  (Config
defaultConfig { exe = "yices-smt2", args = ["--smt2-model-format", "--incremental"] })
  Maybe Int
forall a. Maybe a
Nothing Maybe (Debugger s)
forall a. Maybe a
Nothing