{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedLists #-}
module What4.Solver
(
SolverAdapter(..)
, ExprRangeBindings
, defaultSolverAdapter
, solverAdapterOptions
, LogData(..)
, logCallback
, defaultLogData
, smokeTest
, module What4.SatResult
, ExternalABC(..)
, externalABCAdapter
, abcPath
, abcOptions
, runExternalABCInOverride
, writeABCSMT2File
, Boolector(..)
, boolectorAdapter
, boolectorPath
, runBoolectorInOverride
, withBoolector
, boolectorOptions
, boolectorFeatures
, CVC4(..)
, cvc4Adapter
, cvc4Path
, runCVC4InOverride
, writeCVC4SMT2File
, withCVC4
, cvc4Options
, cvc4Features
, DReal(..)
, DRealBindings
, drealAdapter
, drealPath
, runDRealInOverride
, writeDRealSMT2File
, STP(..)
, stpAdapter
, stpPath
, runSTPInOverride
, withSTP
, stpOptions
, stpFeatures
, yicesAdapter
, yicesPath
, runYicesInOverride
, writeYicesFile
, yicesOptions
, yicesDefaultFeatures
, Z3(..)
, z3Path
, z3Adapter
, runZ3InOverride
, withZ3
, z3Options
, z3Features
) where
import What4.Solver.Adapter
import What4.Solver.Boolector
import What4.Solver.CVC4
import What4.Solver.DReal
import What4.Solver.ExternalABC
import What4.Solver.STP
import What4.Solver.Yices
import What4.Solver.Z3
import What4.SatResult