dejafu/Test/DejaFu/SCT/Bounding.hs
2015-02-09 23:22:06 +00:00

232 lines
9.0 KiB
Haskell
Executable File

{-# LANGUAGE Rank2Types #-}
-- Building blocks for SCT runners based on schedule bounding, with
-- implementations of pre-emption bounding and delay bounding.
module Test.DejaFu.SCT.Bounding where
import Control.DeepSeq (NFData(..), force)
import Data.List.Extra
import Test.DejaFu.Deterministic
import Test.DejaFu.Deterministic.IO (ConcIO)
import Test.DejaFu.SCT.Internal
-- * Pre-emption bounding
-- | An SCT runner using a pre-emption bounding scheduler.
sctPreBound :: Int -> (forall t. Conc t a) -> [(Either Failure a, Trace)]
sctPreBound = sctBounded pbSiblings (pbOffspring False)
-- | Variant of 'sctPreBound' for computations which do 'IO'.
sctPreBoundIO :: Int -> (forall t. ConcIO t a) -> IO [(Either Failure a, Trace)]
sctPreBoundIO = sctBoundedIO pbSiblings (pbOffspring True)
-- | Return all modifications to this schedule which do not introduce
-- extra pre-emptions.
pbSiblings :: Trace -> [[Decision]]
pbSiblings = siblings . map (\(d,a,_) -> (d,a)) where
siblings ((Start i, alts):ds) = [[a] | a@(Start _) <- alts] ++ [Start i : o | o <- siblings ds, not $ null o]
siblings ((SwitchTo i, alts):ds) = [[a] | a@(SwitchTo _) <- alts] ++ [SwitchTo i : o | o <- siblings ds, not $ null o]
siblings ((d, _):ds) = [d : o | o <- siblings ds, not $ null o]
siblings [] = []
-- | Return all modifications to this schedule which do introduce an
-- extra pre-emption. Only introduce pre-emptions around CVar actions
-- and lifts.
pbOffspring :: Bool -> Trace -> [[Decision]]
pbOffspring lifts ((Continue, alts, ta):ds)
| interesting lifts ta = [[n] | n@(SwitchTo _) <- alts] ++ [Continue : n | n <- pbOffspring lifts ds, not $ null n]
| otherwise = [Continue : n | n <- pbOffspring lifts ds, not $ null n]
pbOffspring lifts ((d, _, _):ds) = [d : n | n <- pbOffspring lifts ds, not $ null n]
pbOffspring _ [] = []
-- | Check the pre-emption count of some scheduling decisions.
preEmpCount :: [Decision] -> Int
preEmpCount (SwitchTo _:ss) = 1 + preEmpCount ss
preEmpCount (_:ss) = preEmpCount ss
preEmpCount [] = 0
-- * Delay bounding
-- | An SCT runner using a delay-bounding scheduler.
sctDelayBound :: Int -> (forall t. Conc t a) -> [(Either Failure a, Trace)]
sctDelayBound = sctBounded (const []) (dbOffspring False)
-- | Variant of 'sctDelayBound' for computations which do 'IO'.
sctDelayBoundIO :: Int -> (forall t. ConcIO t a) -> IO [(Either Failure a, Trace)]
sctDelayBoundIO = sctBoundedIO (const []) (dbOffspring True)
-- | Return all modifications to the schedule which introduce an extra
-- delay. Only introduce delays around CVar actions and lifts.
dbOffspring :: Bool -> Trace -> [[Decision]]
dbOffspring lifts ((d, alts, ta):ds)
| interesting lifts ta = [[n] | n <- alts] ++ [d : n | n <- dbOffspring lifts ds, not $ null n]
| otherwise = [d : n | n <- dbOffspring lifts ds, not $ null n]
dbOffspring _ [] = []
-- * SCT runners
-- | An SCT runner using schedule bounding. Schedules are explored in
-- a depth-first fashion.
--
-- Schedules are generated by running the computation with a
-- deterministic scheduler with some initial list of decisions, after
-- which non-pre-emptive decisions are made. The generated suffix is
-- then used to generate \"siblings\" (schedule fragments which, when
-- appended to the prefix, form the prefix of a new schedule which
-- does not increase the bound), and \"offspring\" (like siblings, but
-- the bound has been increased by one). It is important that siblings
-- and offspring are unique, and that the same
-- prefix+sibling/offspring cannot arise from two distinct traces, as
-- otherwise the runner may loop.
--
-- For example, the siblings in the pre-emption bounding runner are
-- those schedule fragments which, when appended to the prefix, form
-- the prefix of a new schedule which does not introduce any new
-- pre-emptions; and the offspring do introduce one new pre-emption.
sctBounded :: (Trace -> [[Decision]])
-- ^ Sibling generation function.
-> (Trace -> [[Decision]])
-- ^ Child generation function.
-> Int
-- ^ Bound, anything < 0 will be interpreted as no bound.
-> (forall t. Conc t a) -> [(Either Failure a, Trace)]
sctBounded siblings offspring b = runSCT' prefixSched (initialS, initialG) bTerm (bStep siblings offspring b)
-- | Variant of 'sctBounded' for computations which do 'IO'.
sctBoundedIO :: (Trace -> [[Decision]])
-> (Trace -> [[Decision]])
-> Int
-> (forall t. ConcIO t a) -> IO [(Either Failure a, Trace)]
sctBoundedIO siblings offspring b = runSCTIO' prefixSched (initialS, initialG) bTerm (bStep siblings offspring b)
-- * State
-- | State for the prefix scheduler.
data Sched = S
{ _decisions :: [Decision]
-- ^ The list of decisions still to make.
, _prefixlen :: Int
-- ^ How long the prefix originally was.
}
instance NFData Sched where
rnf s = rnf (_decisions s, _prefixlen s)
-- | State for the bounded runner.
data State = P
{ _next :: Stream Int [Decision]
-- ^ Schedules to try.
, _halt :: Bool
-- ^ Indicates more schedules couldn't be found, and to halt
-- immediately.
}
-- | Initial scheduler state for the prefix scheduler.
initialS :: Sched
initialS = S { _decisions = [], _prefixlen = 0 }
-- | Initial runner state for the bounded runner.
initialG :: State
initialG = P { _next = Empty 0, _halt = False }
-- * Prefix scheduler
-- | Scheduler which uses a list of scheduling decisions to drive the
-- initial decisions.
prefixSched :: Scheduler Sched
prefixSched = force $ \s prior threads@(next:|_) -> case _decisions s of
-- If we have a decision queued, make it.
(Start t:ds) -> (t, s { _decisions = ds })
(Continue:ds) -> (prior, s { _decisions = ds })
(SwitchTo t:ds) -> (t, s { _decisions = ds })
-- Otherwise just use a non-pre-emptive scheduler.
[] | prior `elem` toList threads -> (prior, s)
| otherwise -> (next, s)
-- * Bounded runner
-- | Termination function: checks for the halt flag.
bTerm :: (a, State) -> Bool
bTerm (_, g) = _halt g
-- | Schedule bounding state step function: computes remaining
-- schedules to try and chooses one.
--
-- This explores schedules in a slightly weird order, it tries to bias
-- towards first exploring schedules with a low, but nonzero, schedule
-- bound. The reason for this is to try to generate simple failing
-- examples quickly, but without getting mired in exploring a lot of
-- zero-bound schedules which might not exhibit a bug.
bStep :: (Trace -> [[Decision]])
-- ^ Sibling generation function.
-> (Trace -> [[Decision]])
-- ^ Offspring generation function.
-> Int
-- ^ Bound.
-> (Sched, State) -> Trace -> (Sched, State)
bStep siblings offspring blim (s, g) t = case _next g of
-- We have schedules remaining, so run the next
Stream (b, x:|xs) rest
| b /= blim && b == 0 -> (s' x, g { _next = (b+1, next) +| (b, this) +| (b, xs) +| rest })
| b /= blim -> (s' x, g { _next = (b, this) +| (b+1, next) +| (b, xs) +| rest })
| otherwise -> (s' x, g { _next = (b, this) +| (b, xs) +| rest })
-- We have no schedules remaining, try to generate some more.
--
-- If there are no more schedules, halt.
Empty b ->
case (this, next) of
-- We still have schedules in the current bound, so add those to
-- the queue (and any schedules from the next bound if we're not at
-- the limit)
(x:xs, _)
| b /= blim && b == 0 -> (s' x, g { _next = (b+1, next) +| (b, xs) +| Empty b })
| b /= blim -> (s' x, g { _next = (b, xs) +| (b+1, next) +| Empty b })
| otherwise -> (s' x, g { _next = (b, xs) +| Empty b })
-- No schedules left in this bound, but if we have some more from
-- the next bound (and we're not at the limit) add those.
([], x:xs)
| b /= blim -> (s' x, g { _next = (b+1, xs) +| Empty (b+1) })
-- No schedules left at all, so halt.
_ -> halt
where
(pref, suff) = splitAtF (\((Start 0,_,_):px) -> (map (\(d,_,_) -> d) px ++)) id (_prefixlen s + 1) t
-- | New scheduler state, with a given list of initial decisions.
s' ds = initialS { _decisions = ds, _prefixlen = length ds }
-- | The halt state
halt = (initialS, g { _halt = True })
-- | All (new, unique) schedules we get from the current one
-- WITHOUT increasing the bound.
this = [ pref y | y <- siblings suff]
-- | All (new, unique) schedules we get from the current one with
-- ONE increase to the bound.
next = [ pref y | y <- offspring suff]
-- * Utils
-- | Check if a 'ThreadAction' might be an interesting candidate for
-- pre-empting or delaying.
interesting :: Bool -> ThreadAction -> Bool
interesting _ (Put _ _) = True
interesting _ (TryPut _ _ _) = True
interesting _ (Take _ _) = True
interesting _ (TryTake _ _ _) = True
interesting _ (BlockedPut _) = True
interesting _ (Read _) = True
interesting _ (BlockedRead _) = True
interesting _ (BlockedTake _) = True
interesting _ (STM _) = True
interesting _ BlockedSTM = True
interesting l Lift = l
interesting _ _ = False