Skip to content
Snippets Groups Projects
Commit 173f0d02 authored by koen's avatar koen
Browse files

unrolling loops a finite amount of times (instead of using invariants)

parent 6a635b58
No related branches found
No related tags found
No related merge requests found
module Settings where module Settings where
testFile = "arrays" testFile, postCond :: String
postCond = "a == b" testFile = "loops"
invariant = "i <= 5" postCond = "x == 5"
\ No newline at end of file
nrOfUnroll :: Int
nrOfUnroll = 6
\ No newline at end of file
...@@ -7,7 +7,7 @@ public class C1 ...@@ -7,7 +7,7 @@ public class C1
int i = 0; int i = 0;
while(i < 5) while(i < 6)
{ {
i++; i++;
......
...@@ -37,7 +37,7 @@ wlpStmtAlgebra = (fStmtBlock, fIfThen, fIfThenElse, fWhile, fBasicFor, fEnhanced ...@@ -37,7 +37,7 @@ wlpStmtAlgebra = (fStmtBlock, fIfThen, fIfThenElse, fWhile, fBasicFor, fEnhanced
fIfThenElse e s1 s2 inh = let e' = getExp (foldExp wlpExpAlgebra e) inh fIfThenElse e s1 s2 inh = let e' = getExp (foldExp wlpExpAlgebra e) inh
in ((\q -> (e' &* fst (s1 inh) q) |* (neg e' &* fst (s2 inh) q)) . acc inh, env inh) in ((\q -> (e' &* fst (s1 inh) q) |* (neg e' &* fst (s2 inh) q)) . acc inh, env inh)
fWhile e s inh = let e' = getExp (foldExp wlpExpAlgebra e) inh fWhile e s inh = let e' = getExp (foldExp wlpExpAlgebra e) inh
in ((\q -> if unsafeIsTrue (((inv &* neg e') `imp` q) &* ((inv &* e') `imp` fst (s inh) inv) &* ((inv &* e') `imp` fst (s inh {br = const q}) true)) then inv else (neg e' &* q)) . acc inh, env inh) in ((\q -> unrollLoop nrOfUnroll e' (fst (s (inh {br = const q}))) q) . acc inh, env inh)
fBasicFor init me incr s inh = let loop = fst (fWhile (fromMaybeGuard me) (\inh' -> s (inh {acc = fst (wlp' inh' (incrToStmt incr))})) inh) in wlp' (inh {acc = loop}) (initToStmt init) fBasicFor init me incr s inh = let loop = fst (fWhile (fromMaybeGuard me) (\inh' -> s (inh {acc = fst (wlp' inh' (incrToStmt incr))})) inh) in wlp' (inh {acc = loop}) (initToStmt init)
fEnhancedFor = error "EnhancedFor" fEnhancedFor = error "EnhancedFor"
fEmpty inh = (acc inh, env inh) -- Empty does nothing, but still passes control to the next statement fEmpty inh = (acc inh, env inh) -- Empty does nothing, but still passes control to the next statement
...@@ -82,11 +82,11 @@ wlpStmtAlgebra = (fStmtBlock, fIfThen, fIfThenElse, fWhile, fBasicFor, fEnhanced ...@@ -82,11 +82,11 @@ wlpStmtAlgebra = (fStmtBlock, fIfThen, fIfThenElse, fWhile, fBasicFor, fEnhanced
-- We don't initialize ref types to null, because we want to keep pointer information -- We don't initialize ref types to null, because we want to keep pointer information
RefType _ -> acc inh RefType _ -> acc inh
wlpDeclAssignment t inh (VarDecl (VarId ident) (Just (InitExp e))) = substVar (env inh) (decls inh) (NameLhs (Name [ident])) e . acc inh wlpDeclAssignment t inh (VarDecl (VarId ident) (Just (InitExp e))) = substVar (env inh) (decls inh) (NameLhs (Name [ident])) e . acc inh
--inv = true -- for simplicity, "True" is used as an invariant for now -- Unrolls a while-loop a finite amount of times
inv = case parser Language.Java.Parser.exp invariant of unrollLoop :: Int -> Exp -> (Exp -> Exp) -> Exp -> Exp
Right e -> e unrollLoop 0 g _ q = neg g `imp` q
_ -> error "syntax error in invariant" unrollLoop n g body q = (neg g `imp` q) &* (g `imp` body (unrollLoop (n - 1) g body q))
-- Converts initialization code of a for loop to a statement -- Converts initialization code of a for loop to a statement
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment