module Language.Hasmtlib.Solver.MathSAT where

import Language.Hasmtlib.Solver.Common
import qualified SMTLIB.Backends.Process as P

mathsat :: ProcessSolver
mathsat :: ProcessSolver
mathsat = Config -> ProcessSolver
ProcessSolver (Config -> ProcessSolver) -> Config -> ProcessSolver
forall a b. (a -> b) -> a -> b
$ Config
P.defaultConfig { P.exe = "mathsat", P.args = [] }