{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -Wall -Werror #-}
module Data.SBV.Tools.BMC (
bmcRefute, bmcRefuteWith, bmcCover, bmcCoverWith
) where
import Data.SBV
import Data.SBV.Control
import Control.Monad (when)
data BMCKind = Refute
| Cover
bmcRefute :: (Queriable IO st, res ~ QueryResult st)
=> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcRefute :: forall st res.
(Queriable IO st, res ~ QueryResult st) =>
Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcRefute = SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
forall st res.
(Queriable IO st, res ~ QueryResult st) =>
SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcRefuteWith SMTConfig
defaultSMTCfg
bmcRefuteWith :: (Queriable IO st, res ~ QueryResult st)
=> SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcRefuteWith :: forall st res.
(Queriable IO st, res ~ QueryResult st) =>
SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcRefuteWith = BMCKind
-> SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
forall st res.
(Queriable IO st, res ~ QueryResult st) =>
BMCKind
-> SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcWith BMCKind
Refute
bmcCover :: (Queriable IO st, res ~ QueryResult st)
=> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcCover :: forall st res.
(Queriable IO st, res ~ QueryResult st) =>
Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcCover = SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
forall st res.
(Queriable IO st, res ~ QueryResult st) =>
SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcCoverWith SMTConfig
defaultSMTCfg
bmcCoverWith :: (Queriable IO st, res ~ QueryResult st)
=> SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcCoverWith :: forall st res.
(Queriable IO st, res ~ QueryResult st) =>
SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcCoverWith = BMCKind
-> SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
forall st res.
(Queriable IO st, res ~ QueryResult st) =>
BMCKind
-> SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcWith BMCKind
Cover
bmcWith :: (Queriable IO st, res ~ QueryResult st)
=> BMCKind -> SMTConfig -> Maybe Int -> Bool -> Symbolic () -> (st -> SBool) -> (st -> st -> SBool) -> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcWith :: forall st res.
(Queriable IO st, res ~ QueryResult st) =>
BMCKind
-> SMTConfig
-> Maybe Int
-> Bool
-> Symbolic ()
-> (st -> SBool)
-> (st -> st -> SBool)
-> (st -> SBool)
-> IO (Either String (Int, [res]))
bmcWith BMCKind
kind SMTConfig
cfg Maybe Int
mbLimit Bool
chatty Symbolic ()
setup st -> SBool
initial st -> st -> SBool
trans st -> SBool
goal
= SMTConfig
-> Symbolic (Either String (Int, [res]))
-> IO (Either String (Int, [res]))
forall a. SMTConfig -> Symbolic a -> IO a
runSMTWith SMTConfig
cfg (Symbolic (Either String (Int, [res]))
-> IO (Either String (Int, [res])))
-> Symbolic (Either String (Int, [res]))
-> IO (Either String (Int, [res]))
forall a b. (a -> b) -> a -> b
$ do Symbolic ()
setup
Query (Either String (Int, [res]))
-> Symbolic (Either String (Int, [res]))
forall a. Query a -> Symbolic a
query (Query (Either String (Int, [res]))
-> Symbolic (Either String (Int, [res])))
-> Query (Either String (Int, [res]))
-> Symbolic (Either String (Int, [res]))
forall a b. (a -> b) -> a -> b
$ do state <- QueryT IO st
forall (m :: * -> *) a. Queriable m a => QueryT m a
create
constrain $ initial state
go 0 state []
where (String
what, String
badResult, String
goodResult) = case BMCKind
kind of
BMCKind
Cover -> (String
"BMC Cover", String
"Cover can't be established.", String
"Satisfying")
BMCKind
Refute -> (String
"BMC Refute", String
"Cannot refute the claim.", String
"Failing")
go :: Int -> st -> [st] -> Query (Either String (Int, [res]))
go Int
i st
_ [st]
_
| Just Int
l <- Maybe Int
mbLimit, Int
i Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
>= Int
l
= Either String (Int, [res]) -> Query (Either String (Int, [res]))
forall a. a -> QueryT IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (Either String (Int, [res]) -> Query (Either String (Int, [res])))
-> Either String (Int, [res]) -> Query (Either String (Int, [res]))
forall a b. (a -> b) -> a -> b
$ String -> Either String (Int, [res])
forall a b. a -> Either a b
Left (String -> Either String (Int, [res]))
-> String -> Either String (Int, [res])
forall a b. (a -> b) -> a -> b
$ String
what String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" limit of " String -> String -> String
forall a. [a] -> [a] -> [a]
++ Int -> String
forall a. Show a => a -> String
show Int
l String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" reached. " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
badResult
go Int
i st
curState [st]
sofar = do Bool -> QueryT IO () -> QueryT IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
chatty (QueryT IO () -> QueryT IO ()) -> QueryT IO () -> QueryT IO ()
forall a b. (a -> b) -> a -> b
$ IO () -> QueryT IO ()
forall a. IO a -> Query a
io (IO () -> QueryT IO ()) -> IO () -> QueryT IO ()
forall a b. (a -> b) -> a -> b
$ String -> IO ()
putStrLn (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ String
what String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
": Iteration: " String -> String -> String
forall a. [a] -> [a] -> [a]
++ Int -> String
forall a. Show a => a -> String
show Int
i
Int -> QueryT IO ()
push Int
1
let g :: SBool
g = st -> SBool
goal st
curState
SBool -> QueryT IO ()
forall a. QuantifiedBool a => a -> QueryT IO ()
forall (m :: * -> *) a.
(SolverContext m, QuantifiedBool a) =>
a -> m ()
constrain (SBool -> QueryT IO ()) -> SBool -> QueryT IO ()
forall a b. (a -> b) -> a -> b
$ case BMCKind
kind of
BMCKind
Cover -> SBool
g
BMCKind
Refute -> SBool -> SBool
sNot SBool
g
cs <- Query CheckSatResult
checkSat
case cs of
DSat{} -> String -> Query (Either String (Int, [res]))
forall a. HasCallStack => String -> a
error (String -> Query (Either String (Int, [res])))
-> String -> Query (Either String (Int, [res]))
forall a b. (a -> b) -> a -> b
$ String
what String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
": Solver returned an unexpected delta-sat result."
CheckSatResult
Sat -> do Bool -> QueryT IO () -> QueryT IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
chatty (QueryT IO () -> QueryT IO ()) -> QueryT IO () -> QueryT IO ()
forall a b. (a -> b) -> a -> b
$ IO () -> QueryT IO ()
forall a. IO a -> Query a
io (IO () -> QueryT IO ()) -> IO () -> QueryT IO ()
forall a b. (a -> b) -> a -> b
$ String -> IO ()
putStrLn (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ String
what String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
": " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
goodResult String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" state found at iteration " String -> String -> String
forall a. [a] -> [a] -> [a]
++ Int -> String
forall a. Show a => a -> String
show Int
i
ms <- (st -> QueryT IO res) -> [st] -> QueryT IO [res]
forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
(a -> m b) -> t a -> m (t b)
forall (m :: * -> *) a b. Monad m => (a -> m b) -> [a] -> m [b]
mapM st -> QueryT IO res
st -> QueryT IO (QueryResult st)
forall (m :: * -> *) a.
Queriable m a =>
a -> QueryT m (QueryResult a)
project (st
curState st -> [st] -> [st]
forall a. a -> [a] -> [a]
: [st]
sofar)
return $ Right (i, reverse ms)
CheckSatResult
Unk -> do Bool -> QueryT IO () -> QueryT IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
chatty (QueryT IO () -> QueryT IO ()) -> QueryT IO () -> QueryT IO ()
forall a b. (a -> b) -> a -> b
$ IO () -> QueryT IO ()
forall a. IO a -> Query a
io (IO () -> QueryT IO ()) -> IO () -> QueryT IO ()
forall a b. (a -> b) -> a -> b
$ String -> IO ()
putStrLn (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ String
what String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
": Backend solver said unknown at iteration " String -> String -> String
forall a. [a] -> [a] -> [a]
++ Int -> String
forall a. Show a => a -> String
show Int
i
Either String (Int, [res]) -> Query (Either String (Int, [res]))
forall a. a -> QueryT IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (Either String (Int, [res]) -> Query (Either String (Int, [res])))
-> Either String (Int, [res]) -> Query (Either String (Int, [res]))
forall a b. (a -> b) -> a -> b
$ String -> Either String (Int, [res])
forall a b. a -> Either a b
Left (String -> Either String (Int, [res]))
-> String -> Either String (Int, [res])
forall a b. (a -> b) -> a -> b
$ String
what String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
": Solver said unknown in iteration " String -> String -> String
forall a. [a] -> [a] -> [a]
++ Int -> String
forall a. Show a => a -> String
show Int
i
CheckSatResult
Unsat -> do Int -> QueryT IO ()
pop Int
1
nextState <- QueryT IO st
forall (m :: * -> *) a. Queriable m a => QueryT m a
create
constrain $ curState `trans` nextState
go (i+1) nextState (curState : sofar)