4577176f6d734982f4a67858bea21e7cb6c25bf2
[bpt/coccinelle.git] / ctl / ctl_engine.ml
1 (*
2 * Copyright 2010, INRIA, University of Copenhagen
3 * Julia Lawall, Rene Rydhof Hansen, Gilles Muller, Nicolas Palix
4 * Copyright 2005-2009, Ecole des Mines de Nantes, University of Copenhagen
5 * Yoann Padioleau, Julia Lawall, Rene Rydhof Hansen, Henrik Stuart, Gilles Muller, Nicolas Palix
6 * This file is part of Coccinelle.
7 *
8 * Coccinelle is free software: you can redistribute it and/or modify
9 * it under the terms of the GNU General Public License as published by
10 * the Free Software Foundation, according to version 2 of the License.
11 *
12 * Coccinelle is distributed in the hope that it will be useful,
13 * but WITHOUT ANY WARRANTY; without even the implied warranty of
14 * MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
15 * GNU General Public License for more details.
16 *
17 * You should have received a copy of the GNU General Public License
18 * along with Coccinelle. If not, see <http://www.gnu.org/licenses/>.
19 *
20 * The authors reserve the right to distribute this or future versions of
21 * Coccinelle under other licenses.
22 *)
23
24
25 (*external c_counter : unit -> int = "c_counter"*)
26 let timeout = 800
27 (* Optimize triples_conj by first extracting the intersection of the two sets,
28 which can certainly be in the intersection *)
29 let pTRIPLES_CONJ_OPT = ref true
30 (* For complement, make NegState for the negation of a single state *)
31 let pTRIPLES_COMPLEMENT_OPT = ref true
32 (* For complement, do something special for the case where the environment
33 and witnesses are empty *)
34 let pTRIPLES_COMPLEMENT_SIMPLE_OPT = ref true
35 (* "Double negate" the arguments of the path operators *)
36 let pDOUBLE_NEGATE_OPT = ref true
37 (* Only do pre_forall/pre_exists on new elements in fixpoint iteration *)
38 let pNEW_INFO_OPT = ref true
39 (* Filter the result of the label function to drop entries that aren't
40 compatible with any of the available environments *)
41 let pREQUIRED_ENV_OPT = ref true
42 (* Memoize the raw result of the label function *)
43 let pSATLABEL_MEMO_OPT = ref true
44 (* Filter results according to the required states *)
45 let pREQUIRED_STATES_OPT = ref true
46 (* Drop negative witnesses at Uncheck *)
47 let pUNCHECK_OPT = ref true
48 let pANY_NEG_OPT = ref true
49 let pLazyOpt = ref true
50
51 (* Nico: This stack is use for graphical traces *)
52 let graph_stack = ref ([] : string list)
53 let graph_hash = (Hashtbl.create 101)
54
55 (*
56 let pTRIPLES_CONJ_OPT = ref false
57 let pTRIPLES_COMPLEMENT_OPT = ref false
58 let pTRIPLES_COMPLEMENT_SIMPLE_OPT = ref false
59 let pDOUBLE_NEGATE_OPT = ref false
60 let pNEW_INFO_OPT = ref false
61 let pREQUIRED_ENV_OPT = ref false
62 let pSATLABEL_MEMO_OPT = ref false
63 let pREQUIRED_STATES_OPT = ref false
64 let pUNCHECK_OPT = ref false
65 let pANY_NEG_OPT = ref false
66 let pLazyOpt = ref false
67 *)
68
69
70 let step_count = ref 0
71 exception Steps
72 let inc_step _ =
73 if not (!step_count = 0)
74 then
75 begin
76 step_count := !step_count - 1;
77 if !step_count = 0 then raise Steps
78 end
79
80 let inc cell = cell := !cell + 1
81
82 let satEU_calls = ref 0
83 let satAW_calls = ref 0
84 let satAU_calls = ref 0
85 let satEF_calls = ref 0
86 let satAF_calls = ref 0
87 let satEG_calls = ref 0
88 let satAG_calls = ref 0
89
90 let triples = ref 0
91
92 let ctr = ref 0
93 let new_let _ =
94 let c = !ctr in
95 ctr := c + 1;
96 Printf.sprintf "_fresh_r_%d" c
97
98 (* **********************************************************************
99 *
100 * Implementation of a Witness Tree model checking engine for CTL-FVex
101 *
102 *
103 * **********************************************************************)
104
105 (* ********************************************************************** *)
106 (* Module: SUBST (substitutions: meta. vars and values) *)
107 (* ********************************************************************** *)
108
109 module type SUBST =
110 sig
111 type value
112 type mvar
113 val eq_mvar: mvar -> mvar -> bool
114 val eq_val: value -> value -> bool
115 val merge_val: value -> value -> value
116 val print_mvar : mvar -> unit
117 val print_value : value -> unit
118 end
119 ;;
120
121 (* ********************************************************************** *)
122 (* Module: GRAPH (control flow graphs / model) *)
123 (* ********************************************************************** *)
124
125 module type GRAPH =
126 sig
127 type node
128 type cfg
129 val predecessors: cfg -> node -> node list
130 val successors: cfg -> node -> node list
131 val extract_is_loop : cfg -> node -> bool
132 val print_node : node -> unit
133 val size : cfg -> int
134 val print_graph : cfg -> string option ->
135 (node * string) list -> (node * string) list -> string -> unit
136 end
137 ;;
138
139 module OGRAPHEXT_GRAPH =
140 struct
141 type node = int;;
142 type cfg = (string,unit) Ograph_extended.ograph_mutable;;
143 let predecessors cfg n = List.map fst ((cfg#predecessors n)#tolist);;
144 let print_node i = Format.print_string (Common.i_to_s i)
145 end
146 ;;
147
148 (* ********************************************************************** *)
149 (* Module: PREDICATE (predicates for CTL formulae) *)
150 (* ********************************************************************** *)
151
152 module type PREDICATE =
153 sig
154 type t
155 val print_predicate : t -> unit
156 end
157
158
159 (* ********************************************************************** *)
160
161 (* ---------------------------------------------------------------------- *)
162 (* Misc. useful generic functions *)
163 (* ---------------------------------------------------------------------- *)
164
165 let get_graph_files () = !graph_stack
166 let get_graph_comp_files outfile = Hashtbl.find_all graph_hash outfile
167
168 let head = List.hd
169
170 let tail l =
171 match l with
172 [] -> []
173 | (x::xs) -> xs
174 ;;
175
176 let foldl = List.fold_left;;
177
178 let foldl1 f xs = foldl f (head xs) (tail xs)
179
180 type 'a esc = ESC of 'a | CONT of 'a
181
182 let foldr = List.fold_right;;
183
184 let concat = List.concat;;
185
186 let map = List.map;;
187
188 let filter = List.filter;;
189
190 let partition = List.partition;;
191
192 let concatmap f l = List.concat (List.map f l);;
193
194 let maybe f g opt =
195 match opt with
196 | None -> g
197 | Some x -> f x
198 ;;
199
200 let some_map f opts = map (maybe (fun x -> Some (f x)) None) opts
201
202 let some_tolist_alt opts = concatmap (maybe (fun x -> [x]) []) opts
203
204 let rec some_tolist opts =
205 match opts with
206 | [] -> []
207 | (Some x)::rest -> x::(some_tolist rest)
208 | _::rest -> some_tolist rest
209 ;;
210
211 let rec groupBy eq l =
212 match l with
213 [] -> []
214 | (x::xs) ->
215 let (xs1,xs2) = partition (fun x' -> eq x x') xs in
216 (x::xs1)::(groupBy eq xs2)
217 ;;
218
219 let group l = groupBy (=) l;;
220
221 let rec memBy eq x l =
222 match l with
223 [] -> false
224 | (y::ys) -> if (eq x y) then true else (memBy eq x ys)
225 ;;
226
227 let rec nubBy eq ls =
228 match ls with
229 [] -> []
230 | (x::xs) when (memBy eq x xs) -> nubBy eq xs
231 | (x::xs) -> x::(nubBy eq xs)
232 ;;
233
234 let rec nub ls =
235 match ls with
236 [] -> []
237 | (x::xs) when (List.mem x xs) -> nub xs
238 | (x::xs) -> x::(nub xs)
239 ;;
240
241 let state_compare (s1,_,_) (s2,_,_) = compare s1 s2
242
243 let setifyBy eq xs = nubBy eq xs;;
244
245 let setify xs = nub xs;;
246
247 let inner_setify xs = List.sort compare (nub xs);;
248
249 let unionBy compare eq xs = function
250 [] -> xs
251 | ys ->
252 let rec loop = function
253 [] -> ys
254 | x::xs -> if memBy eq x ys then loop xs else x::(loop xs) in
255 List.sort compare (loop xs)
256 ;;
257
258 let union xs ys = unionBy state_compare (=) xs ys;;
259
260 let setdiff xs ys = filter (fun x -> not (List.mem x ys)) xs;;
261
262 let subseteqBy eq xs ys = List.for_all (fun x -> memBy eq x ys) xs;;
263
264 let subseteq xs ys = List.for_all (fun x -> List.mem x ys) xs;;
265 let supseteq xs ys = subseteq ys xs
266
267 let setequalBy eq xs ys = (subseteqBy eq xs ys) & (subseteqBy eq ys xs);;
268
269 let setequal xs ys = (subseteq xs ys) & (subseteq ys xs);;
270
271 (* Fix point calculation *)
272 let rec fix eq f x =
273 let x' = f x in if (eq x' x) then x' else fix eq f x'
274 ;;
275
276 (* Fix point calculation on set-valued functions *)
277 let setfix f x = (fix subseteq f x) (*if new is a subset of old, stop*)
278 let setgfix f x = (fix supseteq f x) (*if new is a supset of old, stop*)
279
280 let get_states l = nub (List.map (function (s,_,_) -> s) l)
281
282 (* ********************************************************************** *)
283 (* Module: CTL_ENGINE *)
284 (* ********************************************************************** *)
285
286 module CTL_ENGINE =
287 functor (SUB : SUBST) ->
288 functor (G : GRAPH) ->
289 functor (P : PREDICATE) ->
290 struct
291
292 module A = Ast_ctl
293
294 type substitution = (SUB.mvar, SUB.value) Ast_ctl.generic_substitution
295
296 type ('pred,'anno) witness =
297 (G.node, substitution,
298 ('pred, SUB.mvar, 'anno) Ast_ctl.generic_ctl list)
299 Ast_ctl.generic_witnesstree
300
301 type ('pred,'anno) triples =
302 (G.node * substitution * ('pred,'anno) witness list) list
303
304 (* ---------------------------------------------------------------------- *)
305 (* Pretty printing functions *)
306 (* ---------------------------------------------------------------------- *)
307
308 let (print_generic_substitution : substitution -> unit) = fun substxs ->
309 let print_generic_subst = function
310 A.Subst (mvar, v) ->
311 SUB.print_mvar mvar; Format.print_string " --> "; SUB.print_value v
312 | A.NegSubst (mvar, v) ->
313 SUB.print_mvar mvar; Format.print_string " -/-> "; SUB.print_value v in
314 Format.print_string "[";
315 Common.print_between (fun () -> Format.print_string ";" )
316 print_generic_subst substxs;
317 Format.print_string "]"
318
319 let rec (print_generic_witness: ('pred, 'anno) witness -> unit) =
320 function
321 | A.Wit (state, subst, anno, childrens) ->
322 Format.print_string "wit ";
323 G.print_node state;
324 print_generic_substitution subst;
325 (match childrens with
326 [] -> Format.print_string "{}"
327 | _ ->
328 Format.force_newline(); Format.print_string " "; Format.open_box 0;
329 print_generic_witnesstree childrens; Format.close_box())
330 | A.NegWit(wit) ->
331 Format.print_string "!";
332 print_generic_witness wit
333
334 and (print_generic_witnesstree: ('pred,'anno) witness list -> unit) =
335 fun witnesstree ->
336 Format.open_box 1;
337 Format.print_string "{";
338 Common.print_between
339 (fun () -> Format.print_string ";"; Format.force_newline() )
340 print_generic_witness witnesstree;
341 Format.print_string "}";
342 Format.close_box()
343
344 and print_generic_triple (node,subst,tree) =
345 G.print_node node;
346 print_generic_substitution subst;
347 print_generic_witnesstree tree
348
349 and (print_generic_algo : ('pred,'anno) triples -> unit) = fun xs ->
350 Format.print_string "<";
351 Common.print_between
352 (fun () -> Format.print_string ";"; Format.force_newline())
353 print_generic_triple xs;
354 Format.print_string ">"
355 ;;
356
357 let print_state (str : string) (l : ('pred,'anno) triples) =
358 Printf.printf "%s\n" str;
359 List.iter (function x ->
360 print_generic_triple x; Format.print_newline(); flush stdout)
361 (List.sort compare l);
362 Printf.printf "\n"
363
364 let print_required_states = function
365 None -> Printf.printf "no required states\n"
366 | Some states ->
367 Printf.printf "required states: ";
368 List.iter
369 (function x ->
370 G.print_node x; Format.print_string " "; Format.print_flush())
371 states;
372 Printf.printf "\n"
373
374 let mkstates states = function
375 None -> states
376 | Some states -> states
377
378 let print_graph grp required_states res str = function
379 A.Exists (keep,v,phi) -> ()
380 | phi ->
381 if !Flag_ctl.graphical_trace && not !Flag_ctl.checking_reachability
382 then
383 match phi with
384 | A.Exists (keep,v,phi) -> ()
385 | _ ->
386 let label =
387 Printf.sprintf "%s%s"
388 (String.escaped
389 (Common.format_to_string
390 (function _ ->
391 Pretty_print_ctl.pp_ctl
392 (P.print_predicate, SUB.print_mvar)
393 false phi)))
394 str in
395 let file = (match !Flag.currentfile with
396 None -> "graphical_trace"
397 | Some f -> f
398 ) in
399 (if not (List.mem file !graph_stack) then
400 graph_stack := file :: !graph_stack);
401 let filename = Filename.temp_file (file^":") ".dot" in
402 Hashtbl.add graph_hash file filename;
403 G.print_graph grp
404 (if !Flag_ctl.gt_without_label then None else (Some label))
405 (match required_states with
406 None -> []
407 | Some required_states ->
408 (List.map (function s -> (s,"blue")) required_states))
409 (List.map (function (s,_,_) -> (s,"\"#FF8080\"")) res) filename
410
411 let print_graph_c grp required_states res ctr phi =
412 let str = "iter: "^(string_of_int !ctr) in
413 print_graph grp required_states res str phi
414
415 (* ---------------------------------------------------------------------- *)
416 (* *)
417 (* ---------------------------------------------------------------------- *)
418
419
420 (* ************************* *)
421 (* Substitutions *)
422 (* ************************* *)
423
424 let dom_sub sub =
425 match sub with
426 | A.Subst(x,_) -> x
427 | A.NegSubst(x,_) -> x
428 ;;
429
430 let ran_sub sub =
431 match sub with
432 | A.Subst(_,x) -> x
433 | A.NegSubst(_,x) -> x
434 ;;
435
436 let eq_subBy eqx eqv sub sub' =
437 match (sub,sub') with
438 | (A.Subst(x,v),A.Subst(x',v')) -> (eqx x x') && (eqv v v')
439 | (A.NegSubst(x,v),A.NegSubst(x',v')) -> (eqx x x') && (eqv v v')
440 | _ -> false
441 ;;
442
443 (* NOTE: functor *)
444 let eq_sub sub sub' = eq_subBy SUB.eq_mvar SUB.eq_val sub sub'
445
446 let eq_subst th th' = setequalBy eq_sub th th';;
447
448 let merge_subBy eqx (===) (>+<) sub sub' =
449 (* variable part is guaranteed to be the same *)
450 match (sub,sub') with
451 (A.Subst (x,v),A.Subst (x',v')) ->
452 if (v === v')
453 then Some [A.Subst(x, v >+< v')]
454 else None
455 | (A.NegSubst(x,v),A.Subst(x',v')) ->
456 if (not (v === v'))
457 then Some [A.Subst(x',v')]
458 else None
459 | (A.Subst(x,v),A.NegSubst(x',v')) ->
460 if (not (v === v'))
461 then Some [A.Subst(x,v)]
462 else None
463 | (A.NegSubst(x,v),A.NegSubst(x',v')) ->
464 if (v === v')
465 then
466 let merged = v >+< v' in
467 if merged = v && merged = v'
468 then Some [A.NegSubst(x,v >+< v')]
469 else
470 (* positions are compatible, but not identical. keep apart. *)
471 Some [A.NegSubst(x,v);A.NegSubst(x',v')]
472 else Some [A.NegSubst(x,v);A.NegSubst(x',v')]
473 ;;
474
475 (* NOTE: functor *)
476 (* How could we accomadate subterm constraints here??? *)
477 let merge_sub sub sub' =
478 merge_subBy SUB.eq_mvar SUB.eq_val SUB.merge_val sub sub'
479
480 let clean_substBy eq cmp theta = List.sort cmp (nubBy eq theta);;
481
482 (* NOTE: we sort by using the generic "compare" on (meta-)variable
483 * names; we could also require a definition of compare for meta-variables
484 * or substitutions but that seems like overkill for sorting
485 *)
486 let clean_subst theta =
487 let res =
488 clean_substBy eq_sub
489 (fun s s' ->
490 let res = compare (dom_sub s) (dom_sub s') in
491 if res = 0
492 then
493 match (s,s') with
494 (A.Subst(_,_),A.NegSubst(_,_)) -> -1
495 | (A.NegSubst(_,_),A.Subst(_,_)) -> 1
496 | _ -> compare (ran_sub s) (ran_sub s')
497 else res)
498 theta in
499 let rec loop = function
500 [] -> []
501 | (A.Subst(x,v)::A.NegSubst(y,v')::rest) when SUB.eq_mvar x y ->
502 loop (A.Subst(x,v)::rest)
503 | x::xs -> x::(loop xs) in
504 loop res
505
506 let top_subst = [];; (* Always TRUE subst. *)
507
508 (* Split a theta in two parts: one with (only) "x" and one without *)
509 (* NOTE: functor *)
510 let split_subst theta x =
511 partition (fun sub -> SUB.eq_mvar (dom_sub sub) x) theta;;
512
513 exception SUBST_MISMATCH
514 let conj_subst theta theta' =
515 match (theta,theta') with
516 | ([],_) -> Some theta'
517 | (_,[]) -> Some theta
518 | _ ->
519 let rec classify = function
520 [] -> []
521 | [x] -> [(dom_sub x,[x])]
522 | x::xs ->
523 (match classify xs with
524 ((nm,y)::ys) as res ->
525 if dom_sub x = nm
526 then (nm,x::y)::ys
527 else (dom_sub x,[x])::res
528 | _ -> failwith "not possible") in
529 let merge_all theta theta' =
530 foldl
531 (function rest ->
532 function sub ->
533 foldl
534 (function rest ->
535 function sub' ->
536 match (merge_sub sub sub') with
537 Some subs -> subs @ rest
538 | _ -> raise SUBST_MISMATCH)
539 rest theta')
540 [] theta in
541 let rec loop = function
542 ([],ctheta') ->
543 List.concat (List.map (function (_,ths) -> ths) ctheta')
544 | (ctheta,[]) ->
545 List.concat (List.map (function (_,ths) -> ths) ctheta)
546 | ((x,ths)::xs,(y,ths')::ys) ->
547 (match compare x y with
548 0 -> (merge_all ths ths') @ loop (xs,ys)
549 | -1 -> ths @ loop (xs,((y,ths')::ys))
550 | 1 -> ths' @ loop (((x,ths)::xs),ys)
551 | _ -> failwith "not possible") in
552 try Some (clean_subst(loop (classify theta, classify theta')))
553 with SUBST_MISMATCH -> None
554 ;;
555
556 (* theta' must be a subset of theta *)
557 let conj_subst_none theta theta' =
558 match (theta,theta') with
559 | (_,[]) -> Some theta
560 | ([],_) -> None
561 | _ ->
562 let rec classify = function
563 [] -> []
564 | [x] -> [(dom_sub x,[x])]
565 | x::xs ->
566 (match classify xs with
567 ((nm,y)::ys) as res ->
568 if dom_sub x = nm
569 then (nm,x::y)::ys
570 else (dom_sub x,[x])::res
571 | _ -> failwith "not possible") in
572 let merge_all theta theta' =
573 foldl
574 (function rest ->
575 function sub ->
576 foldl
577 (function rest ->
578 function sub' ->
579 match (merge_sub sub sub') with
580 Some subs -> subs @ rest
581 | _ -> raise SUBST_MISMATCH)
582 rest theta')
583 [] theta in
584 let rec loop = function
585 (ctheta,[]) ->
586 List.concat (List.map (function (_,ths) -> ths) ctheta)
587 | ([],ctheta') -> raise SUBST_MISMATCH
588 | ((x,ths)::xs,(y,ths')::ys) ->
589 (match compare x y with
590 0 -> (merge_all ths ths') @ loop (xs,ys)
591 | -1 -> ths @ loop (xs,((y,ths')::ys))
592 | 1 -> raise SUBST_MISMATCH
593 | _ -> failwith "not possible") in
594 try Some (clean_subst(loop (classify theta, classify theta')))
595 with SUBST_MISMATCH -> None
596 ;;
597
598 let negate_sub sub =
599 match sub with
600 | A.Subst(x,v) -> A.NegSubst (x,v)
601 | A.NegSubst(x,v) -> A.Subst(x,v)
602 ;;
603
604 (* Turn a (big) theta into a list of (small) thetas *)
605 let negate_subst theta = (map (fun sub -> [negate_sub sub]) theta);;
606
607
608 (* ************************* *)
609 (* Witnesses *)
610 (* ************************* *)
611
612 (* Always TRUE witness *)
613 let top_wit = ([] : (('pred, 'anno) witness list));;
614
615 let eq_wit wit wit' = wit = wit';;
616
617 let union_wit wit wit' = (*List.sort compare (wit' @ wit) for popl*)
618 let res = unionBy compare (=) wit wit' in
619 let anynegwit = (* if any is neg, then all are *)
620 List.exists (function A.NegWit _ -> true | A.Wit _ -> false) in
621 if anynegwit res
622 then List.filter (function A.NegWit _ -> true | A.Wit _ -> false) res
623 else res
624
625 let negate_wit wit = A.NegWit wit (*
626 match wit with
627 | A.Wit(s,th,anno,ws) -> A.NegWitWit(s,th,anno,ws)
628 | A.NegWitWit(s,th,anno,ws) -> A.Wit(s,th,anno,ws)*)
629 ;;
630
631 let negate_wits wits =
632 List.sort compare (map (fun wit -> [negate_wit wit]) wits);;
633
634 let unwitify trips =
635 let anynegwit = (* if any is neg, then all are *)
636 List.exists (function A.NegWit _ -> true | A.Wit _ -> false) in
637 setify
638 (List.fold_left
639 (function prev ->
640 function (s,th,wit) ->
641 if anynegwit wit then prev else (s,th,top_wit)::prev)
642 [] trips)
643
644 (* ************************* *)
645 (* Triples *)
646 (* ************************* *)
647
648 (* Triples are equal when the constituents are equal *)
649 let eq_trip (s,th,wit) (s',th',wit') =
650 (s = s') && (eq_wit wit wit') && (eq_subst th th');;
651
652 let triples_top states = map (fun s -> (s,top_subst,top_wit)) states;;
653
654 let normalize trips =
655 List.map
656 (function (st,th,wit) -> (st,List.sort compare th,List.sort compare wit))
657 trips
658
659
660 (* conj opt doesn't work ((1,[],{{x=3}}) v (1,[],{{x=4}})) & (1,[],{{x=4}}) =
661 (1,[],{{x=3},{x=4}}), not (1,[],{{x=4}}) *)
662 let triples_conj trips trips' =
663 let (trips,shared,trips') =
664 if false && !pTRIPLES_CONJ_OPT (* see comment above *)
665 then
666 let (shared,trips) =
667 List.partition (function t -> List.mem t trips') trips in
668 let trips' =
669 List.filter (function t -> not(List.mem t shared)) trips' in
670 (trips,shared,trips')
671 else (trips,[],trips') in
672 foldl (* returns a set - setify inlined *)
673 (function rest ->
674 function (s1,th1,wit1) ->
675 foldl
676 (function rest ->
677 function (s2,th2,wit2) ->
678 if (s1 = s2) then
679 (match (conj_subst th1 th2) with
680 Some th ->
681 let t = (s1,th,union_wit wit1 wit2) in
682 if List.mem t rest then rest else t::rest
683 | _ -> rest)
684 else rest)
685 rest trips')
686 shared trips
687 ;;
688
689 (* ignore the state in the right argument. always pretend it is the same as
690 the left one *)
691 (* env on right has to be a subset of env on left *)
692 let triples_conj_none trips trips' =
693 let (trips,shared,trips') =
694 if false && !pTRIPLES_CONJ_OPT (* see comment above *)
695 then
696 let (shared,trips) =
697 List.partition (function t -> List.mem t trips') trips in
698 let trips' =
699 List.filter (function t -> not(List.mem t shared)) trips' in
700 (trips,shared,trips')
701 else (trips,[],trips') in
702 foldl (* returns a set - setify inlined *)
703 (function rest ->
704 function (s1,th1,wit1) ->
705 foldl
706 (function rest ->
707 function (s2,th2,wit2) ->
708 match (conj_subst_none th1 th2) with
709 Some th ->
710 let t = (s1,th,union_wit wit1 wit2) in
711 if List.mem t rest then rest else t::rest
712 | _ -> rest)
713 rest trips')
714 shared trips
715 ;;
716
717 exception AW
718
719 let triples_conj_AW trips trips' =
720 let (trips,shared,trips') =
721 if false && !pTRIPLES_CONJ_OPT
722 then
723 let (shared,trips) =
724 List.partition (function t -> List.mem t trips') trips in
725 let trips' =
726 List.filter (function t -> not(List.mem t shared)) trips' in
727 (trips,shared,trips')
728 else (trips,[],trips') in
729 foldl (* returns a set - setify inlined *)
730 (function rest ->
731 function (s1,th1,wit1) ->
732 foldl
733 (function rest ->
734 function (s2,th2,wit2) ->
735 if (s1 = s2) then
736 (match (conj_subst th1 th2) with
737 Some th ->
738 let t = (s1,th,union_wit wit1 wit2) in
739 if List.mem t rest then rest else t::rest
740 | _ -> raise AW)
741 else rest)
742 rest trips')
743 shared trips
744 ;;
745
746 (* *************************** *)
747 (* NEGATION (NegState style) *)
748 (* *************************** *)
749
750 (* Constructive negation at the state level *)
751 type ('a) state =
752 PosState of 'a
753 | NegState of 'a list
754 ;;
755
756 let compatible_states = function
757 (PosState s1, PosState s2) ->
758 if s1 = s2 then Some (PosState s1) else None
759 | (PosState s1, NegState s2) ->
760 if List.mem s1 s2 then None else Some (PosState s1)
761 | (NegState s1, PosState s2) ->
762 if List.mem s2 s1 then None else Some (PosState s2)
763 | (NegState s1, NegState s2) -> Some (NegState (s1 @ s2))
764 ;;
765
766 (* Conjunction on triples with "special states" *)
767 let triples_state_conj trips trips' =
768 let (trips,shared,trips') =
769 if !pTRIPLES_CONJ_OPT
770 then
771 let (shared,trips) =
772 List.partition (function t -> List.mem t trips') trips in
773 let trips' =
774 List.filter (function t -> not(List.mem t shared)) trips' in
775 (trips,shared,trips')
776 else (trips,[],trips') in
777 foldl
778 (function rest ->
779 function (s1,th1,wit1) ->
780 foldl
781 (function rest ->
782 function (s2,th2,wit2) ->
783 match compatible_states(s1,s2) with
784 Some s ->
785 (match (conj_subst th1 th2) with
786 Some th ->
787 let t = (s,th,union_wit wit1 wit2) in
788 if List.mem t rest then rest else t::rest
789 | _ -> rest)
790 | _ -> rest)
791 rest trips')
792 shared trips
793 ;;
794
795 let triple_negate (s,th,wits) =
796 let negstates = (NegState [s],top_subst,top_wit) in
797 let negths = map (fun th -> (PosState s,th,top_wit)) (negate_subst th) in
798 let negwits = map (fun nwit -> (PosState s,th,nwit)) (negate_wits wits) in
799 negstates :: (negths @ negwits) (* all different *)
800
801 (* FIX ME: it is not necessary to do full conjunction *)
802 let triples_complement states (trips : ('pred, 'anno) triples) =
803 if !pTRIPLES_COMPLEMENT_OPT
804 then
805 (let cleanup (s,th,wit) =
806 match s with
807 PosState s' -> [(s',th,wit)]
808 | NegState ss ->
809 assert (th=top_subst);
810 assert (wit=top_wit);
811 map (fun st -> (st,top_subst,top_wit)) (setdiff states ss) in
812 let (simple,complex) =
813 if !pTRIPLES_COMPLEMENT_SIMPLE_OPT
814 then
815 let (simple,complex) =
816 List.partition (function (s,[],[]) -> true | _ -> false) trips in
817 let simple =
818 [(NegState(List.map (function (s,_,_) -> s) simple),
819 top_subst,top_wit)] in
820 (simple,complex)
821 else ([(NegState [],top_subst,top_wit)],trips) in
822 let rec compl trips =
823 match trips with
824 [] -> simple
825 | (t::ts) -> triples_state_conj (triple_negate t) (compl ts) in
826 let compld = (compl complex) in
827 let compld = concatmap cleanup compld in
828 compld)
829 else
830 let negstates (st,th,wits) =
831 map (function st -> (st,top_subst,top_wit)) (setdiff states [st]) in
832 let negths (st,th,wits) =
833 map (function th -> (st,th,top_wit)) (negate_subst th) in
834 let negwits (st,th,wits) =
835 map (function nwit -> (st,th,nwit)) (negate_wits wits) in
836 match trips with
837 [] -> map (function st -> (st,top_subst,top_wit)) states
838 | x::xs ->
839 setify
840 (foldl
841 (function prev ->
842 function cur ->
843 triples_conj (negstates cur @ negths cur @ negwits cur) prev)
844 (negstates x @ negths x @ negwits x) xs)
845 ;;
846
847 let triple_negate (s,th,wits) =
848 let negths = map (fun th -> (s,th,top_wit)) (negate_subst th) in
849 let negwits = map (fun nwit -> (s,th,nwit)) (negate_wits wits) in
850 ([s], negths @ negwits) (* all different *)
851
852 let print_compl_state str (n,p) =
853 Printf.printf "%s neg: " str;
854 List.iter
855 (function x -> G.print_node x; Format.print_flush(); Printf.printf " ")
856 n;
857 Printf.printf "\n";
858 print_state "pos" p
859
860 let triples_complement states (trips : ('pred, 'anno) triples) =
861 if trips = []
862 then map (function st -> (st,top_subst,top_wit)) states
863 else
864 let cleanup (neg,pos) =
865 let keep_pos =
866 List.filter (function (s,_,_) -> List.mem s neg) pos in
867 (map (fun st -> (st,top_subst,top_wit)) (setdiff states neg)) @
868 keep_pos in
869 let trips = List.sort state_compare trips in
870 let all_negated = List.map triple_negate trips in
871 let merge_one (neg1,pos1) (neg2,pos2) =
872 let (pos1conj,pos1keep) =
873 List.partition (function (s,_,_) -> List.mem s neg2) pos1 in
874 let (pos2conj,pos2keep) =
875 List.partition (function (s,_,_) -> List.mem s neg1) pos2 in
876 (Common.union_set neg1 neg2,
877 (triples_conj pos1conj pos2conj) @ pos1keep @ pos2keep) in
878 let rec inner_loop = function
879 x1::x2::rest -> (merge_one x1 x2) :: (inner_loop rest)
880 | l -> l in
881 let rec outer_loop = function
882 [x] -> x
883 | l -> outer_loop (inner_loop l) in
884 cleanup (outer_loop all_negated)
885
886 (* ********************************** *)
887 (* END OF NEGATION (NegState style) *)
888 (* ********************************** *)
889
890 (* now this is always true, so we could get rid of it *)
891 let something_dropped = ref true
892
893 let triples_union trips trips' =
894 (*unionBy compare eq_trip trips trips';;*)
895 (* returns -1 is t1 > t2, 1 if t2 >= t1, and 0 otherwise *)
896 (*
897 The following does not work. Suppose we have ([x->3],{A}) and ([],{A,B}).
898 Then, the following says that since the first is a more restrictive
899 environment and has fewer witnesses, then it should be dropped. But having
900 fewer witnesses is not necessarily less informative than having more,
901 because fewer witnesses can mean the absence of the witness-causing thing.
902 So the fewer witnesses have to be kept around.
903 subseteq changed to = to make it hopefully work
904 *)
905 if !pNEW_INFO_OPT
906 then
907 begin
908 something_dropped := false;
909 if trips = trips'
910 then (something_dropped := true; trips)
911 else
912 let subsumes (s1,th1,wit1) (s2,th2,wit2) =
913 if s1 = s2
914 then
915 (match conj_subst th1 th2 with
916 Some conj ->
917 if conj = th1
918 then if (*subseteq*) wit1 = wit2 then 1 else 0
919 else
920 if conj = th2
921 then if (*subseteq*) wit2 = wit1 then (-1) else 0
922 else 0
923 | None -> 0)
924 else 0 in
925 let rec first_loop second = function
926 [] -> second
927 | x::xs -> first_loop (second_loop x second) xs
928 and second_loop x = function
929 [] -> [x]
930 | (y::ys) as all ->
931 match subsumes x y with
932 1 -> something_dropped := true; all
933 | (-1) -> second_loop x ys
934 | _ -> y::(second_loop x ys) in
935 first_loop trips trips'
936 end
937 else unionBy compare eq_trip trips trips'
938
939
940 let triples_witness x unchecked not_keep trips =
941 let anyneg = (* if any is neg, then all are *)
942 List.exists (function A.NegSubst _ -> true | A.Subst _ -> false) in
943 let anynegwit = (* if any is neg, then all are *)
944 List.exists (function A.NegWit _ -> true | A.Wit _ -> false) in
945 let allnegwit = (* if any is neg, then all are *)
946 List.for_all (function A.NegWit _ -> true | A.Wit _ -> false) in
947 let negtopos =
948 List.map (function A.NegWit w -> w | A.Wit _ -> failwith "bad wit")in
949 let res =
950 List.fold_left
951 (function prev ->
952 function (s,th,wit) as t ->
953 let (th_x,newth) = split_subst th x in
954 match th_x with
955 [] ->
956 (* one consider whether if not not_keep is true, then we should
957 fail. but it could be that the variable is a used_after and
958 then it is the later rule that should fail and not this one *)
959 if not not_keep && !Flag_ctl.verbose_ctl_engine
960 then
961 (SUB.print_mvar x; Format.print_flush();
962 print_state ": empty witness from" [t]);
963 t::prev
964 | l when anyneg l && !pANY_NEG_OPT -> prev
965 (* see tests/nestseq for how neg bindings can come up even
966 without eg partial matches
967 (* negated substitution only allowed with negwits.
968 just dropped *)
969 if anynegwit wit && allnegwit wit (* nonempty negwit list *)
970 then prev
971 else
972 (print_generic_substitution l; Format.print_newline();
973 failwith"unexpected negative binding with positive witnesses")*)
974 | _ ->
975 let new_triple =
976 if unchecked or not_keep
977 then (s,newth,wit)
978 else
979 if anynegwit wit && allnegwit wit
980 then (s,newth,[A.NegWit(A.Wit(s,th_x,[],negtopos wit))])
981 else (s,newth,[A.Wit(s,th_x,[],wit)]) in
982 new_triple::prev)
983 [] trips in
984 if unchecked || !Flag_ctl.partial_match (* the only way to have a NegWit *)
985 then setify res
986 else List.rev res
987 ;;
988
989
990 (* ---------------------------------------------------------------------- *)
991 (* SAT - Model Checking Algorithm for CTL-FVex *)
992 (* *)
993 (* TODO: Implement _all_ operators (directly) *)
994 (* ---------------------------------------------------------------------- *)
995
996
997 (* ************************************* *)
998 (* The SAT algorithm and special helpers *)
999 (* ************************************* *)
1000
1001 let rec pre_exist dir (grp,_,_) y reqst =
1002 let check s =
1003 match reqst with None -> true | Some reqst -> List.mem s reqst in
1004 let exp (s,th,wit) =
1005 concatmap
1006 (fun s' -> if check s' then [(s',th,wit)] else [])
1007 (match dir with
1008 A.FORWARD -> G.predecessors grp s
1009 | A.BACKWARD -> G.successors grp s) in
1010 setify (concatmap exp y)
1011 ;;
1012
1013 exception Empty
1014
1015 let pre_forall dir (grp,_,states) y all reqst =
1016 let check s =
1017 match reqst with
1018 None -> true | Some reqst -> List.mem s reqst in
1019 let pred =
1020 match dir with
1021 A.FORWARD -> G.predecessors | A.BACKWARD -> G.successors in
1022 let succ =
1023 match dir with
1024 A.FORWARD -> G.successors | A.BACKWARD -> G.predecessors in
1025 let neighbors =
1026 List.map
1027 (function p -> (p,succ grp p))
1028 (setify
1029 (concatmap
1030 (function (s,_,_) -> List.filter check (pred grp s)) y)) in
1031 (* would a hash table be more efficient? *)
1032 let all = List.sort state_compare all in
1033 let rec up_nodes child s = function
1034 [] -> []
1035 | (s1,th,wit)::xs ->
1036 (match compare s1 child with
1037 -1 -> up_nodes child s xs
1038 | 0 -> (s,th,wit)::(up_nodes child s xs)
1039 | _ -> []) in
1040 let neighbor_triples =
1041 List.fold_left
1042 (function rest ->
1043 function (s,children) ->
1044 try
1045 (List.map
1046 (function child ->
1047 match up_nodes child s all with [] -> raise Empty | l -> l)
1048 children) :: rest
1049 with Empty -> rest)
1050 [] neighbors in
1051 match neighbor_triples with
1052 [] -> []
1053 | _ ->
1054 (*normalize*)
1055 (foldl1 (@) (List.map (foldl1 triples_conj) neighbor_triples))
1056
1057 let pre_forall_AW dir (grp,_,states) y all reqst =
1058 let check s =
1059 match reqst with
1060 None -> true | Some reqst -> List.mem s reqst in
1061 let pred =
1062 match dir with
1063 A.FORWARD -> G.predecessors | A.BACKWARD -> G.successors in
1064 let succ =
1065 match dir with
1066 A.FORWARD -> G.successors | A.BACKWARD -> G.predecessors in
1067 let neighbors =
1068 List.map
1069 (function p -> (p,succ grp p))
1070 (setify
1071 (concatmap
1072 (function (s,_,_) -> List.filter check (pred grp s)) y)) in
1073 (* would a hash table be more efficient? *)
1074 let all = List.sort state_compare all in
1075 let rec up_nodes child s = function
1076 [] -> []
1077 | (s1,th,wit)::xs ->
1078 (match compare s1 child with
1079 -1 -> up_nodes child s xs
1080 | 0 -> (s,th,wit)::(up_nodes child s xs)
1081 | _ -> []) in
1082 let neighbor_triples =
1083 List.fold_left
1084 (function rest ->
1085 function (s,children) ->
1086 (List.map
1087 (function child ->
1088 match up_nodes child s all with [] -> raise AW | l -> l)
1089 children) :: rest)
1090 [] neighbors in
1091 match neighbor_triples with
1092 [] -> []
1093 | _ -> foldl1 (@) (List.map (foldl1 triples_conj_AW) neighbor_triples)
1094
1095 (* drop_negwits will call setify *)
1096 let satEX dir m s reqst = pre_exist dir m s reqst;;
1097
1098 let satAX dir m s reqst = pre_forall dir m s s reqst
1099 ;;
1100
1101 (* E[phi1 U phi2] == phi2 \/ (phi1 /\ EXE[phi1 U phi2]) *)
1102 let satEU dir ((_,_,states) as m) s1 s2 reqst print_graph =
1103 (*Printf.printf "EU\n";
1104 let ctr = ref 0 in*)
1105 inc satEU_calls;
1106 if s1 = []
1107 then s2
1108 else
1109 (*let ctr = ref 0 in*)
1110 if !pNEW_INFO_OPT
1111 then
1112 let rec f y new_info =
1113 inc_step();
1114 match new_info with
1115 [] -> y
1116 | new_info ->
1117 (*ctr := !ctr + 1;
1118 print_graph y ctr;*)
1119 let first = triples_conj s1 (pre_exist dir m new_info reqst) in
1120 let res = triples_union first y in
1121 let new_info = setdiff res y in
1122 (*Printf.printf "iter %d res %d new_info %d\n"
1123 !ctr (List.length res) (List.length new_info);
1124 print_state "res" res;
1125 print_state "new_info" new_info;
1126 flush stdout;*)
1127 f res new_info in
1128 f s2 s2
1129 else
1130 let f y =
1131 inc_step();
1132 (*ctr := !ctr + 1;
1133 print_graph y ctr;*)
1134 let pre = pre_exist dir m y reqst in
1135 triples_union s2 (triples_conj s1 pre) in
1136 setfix f s2
1137 ;;
1138
1139 (* EF phi == E[true U phi] *)
1140 let satEF dir m s2 reqst =
1141 inc satEF_calls;
1142 (*let ctr = ref 0 in*)
1143 if !pNEW_INFO_OPT
1144 then
1145 let rec f y new_info =
1146 inc_step();
1147 match new_info with
1148 [] -> y
1149 | new_info ->
1150 (*ctr := !ctr + 1;
1151 print_state (Printf.sprintf "iteration %d\n" !ctr) y;*)
1152 let first = pre_exist dir m new_info reqst in
1153 let res = triples_union first y in
1154 let new_info = setdiff res y in
1155 (*Printf.printf "EF %s iter %d res %d new_info %d\n"
1156 (if dir = A.BACKWARD then "reachable" else "real ef")
1157 !ctr (List.length res) (List.length new_info);
1158 print_state "new info" new_info;
1159 flush stdout;*)
1160 f res new_info in
1161 f s2 s2
1162 else
1163 let f y =
1164 inc_step();
1165 let pre = pre_exist dir m y reqst in
1166 triples_union s2 pre in
1167 setfix f s2
1168
1169
1170 type ('pred,'anno) auok =
1171 AUok of ('pred,'anno) triples | AUfailed of ('pred,'anno) triples
1172
1173 (* A[phi1 U phi2] == phi2 \/ (phi1 /\ AXA[phi1 U phi2]) *)
1174 let satAU dir ((cfg,_,states) as m) s1 s2 reqst print_graph =
1175 let ctr = ref 0 in
1176 inc satAU_calls;
1177 if s1 = []
1178 then AUok s2
1179 else
1180 (*let ctr = ref 0 in*)
1181 let pre_forall =
1182 if !Flag_ctl.loop_in_src_code
1183 then pre_forall_AW
1184 else pre_forall in
1185 if !pNEW_INFO_OPT
1186 then
1187 let rec f y newinfo =
1188 inc_step();
1189 match newinfo with
1190 [] -> AUok y
1191 | new_info ->
1192 ctr := !ctr + 1;
1193 (*print_state (Printf.sprintf "iteration %d\n" !ctr) y;
1194 flush stdout;*)
1195 print_graph y ctr;
1196 let pre =
1197 try Some (pre_forall dir m new_info y reqst)
1198 with AW -> None in
1199 match pre with
1200 None -> AUfailed y
1201 | Some pre ->
1202 match triples_conj s1 pre with
1203 [] -> AUok y
1204 | first ->
1205 (*print_state "s1" s1;
1206 print_state "pre" pre;
1207 print_state "first" first;*)
1208 let res = triples_union first y in
1209 let new_info =
1210 if not !something_dropped
1211 then first
1212 else setdiff res y in
1213 (*Printf.printf
1214 "iter %d res %d new_info %d\n"
1215 !ctr (List.length res) (List.length new_info);
1216 flush stdout;*)
1217 f res new_info in
1218 f s2 s2
1219 else
1220 if !Flag_ctl.loop_in_src_code
1221 then AUfailed s2
1222 else
1223 (*let setfix =
1224 fix (function s1 -> function s2 ->
1225 let s1 = List.map (function (s,th,w) -> (s,th,nub w)) s1 in
1226 let s2 = List.map (function (s,th,w) -> (s,th,nub w)) s2 in
1227 subseteq s1 s2) in for popl *)
1228 let f y =
1229 inc_step();
1230 ctr := !ctr + 1;
1231 print_graph y ctr;
1232 let pre = pre_forall dir m y y reqst in
1233 triples_union s2 (triples_conj s1 pre) in
1234 AUok (setfix f s2)
1235 ;;
1236
1237
1238 (* reqst could be the states of s1 *)
1239 (*
1240 let lstates = mkstates states reqst in
1241 let initial_removed =
1242 triples_complement lstates (triples_union s1 s2) in
1243 let initial_base = triples_conj s1 (triples_complement lstates s2) in
1244 let rec loop base removed =
1245 let new_removed =
1246 triples_conj base (pre_exist dir m removed reqst) in
1247 let new_base =
1248 triples_conj base (triples_complement lstates new_removed) in
1249 if supseteq new_base base
1250 then triples_union base s2
1251 else loop new_base new_removed in
1252 loop initial_base initial_removed *)
1253
1254 let satAW dir ((grp,_,states) as m) s1 s2 reqst =
1255 inc satAW_calls;
1256 if s1 = []
1257 then s2
1258 else
1259 (*
1260 This works extremely badly when the region is small and the end of the
1261 region is very ambiguous, eg free(x) ... x
1262 see free.c
1263 if !pNEW_INFO_OPT
1264 then
1265 let get_states l = setify(List.map (function (s,_,_) -> s) l) in
1266 let ostates = Common.union_set (get_states s1) (get_states s2) in
1267 let succ =
1268 (match dir with
1269 A.FORWARD -> G.successors grp
1270 | A.BACKWARD -> G.predecessors grp) in
1271 let states =
1272 List.fold_left Common.union_set ostates (List.map succ ostates) in
1273 let negphi = triples_complement states s1 in
1274 let negpsi = triples_complement states s2 in
1275 triples_complement ostates
1276 (satEU dir m negpsi (triples_conj negphi negpsi) (Some ostates))
1277 else
1278 *)
1279 (*let ctr = ref 0 in*)
1280 let f y =
1281 inc_step();
1282 (*ctr := !ctr + 1;
1283 Printf.printf "iter %d y %d\n" !ctr (List.length y);
1284 print_state "y" y;
1285 flush stdout;*)
1286 let pre = pre_forall dir m y y reqst in
1287 (*print_state "pre" pre;*)
1288 let conj = triples_conj s1 pre in (* or triples_conj_AW *)
1289 triples_union s2 conj in
1290 let drop_wits = List.map (function (s,e,_) -> (s,e,[])) in
1291 (* drop wits on s1 represents that we don't want any witnesses from
1292 the case that infinitely loops, only from the case that gets
1293 out of the loop. s1 is like a guard. To see the problem, consider
1294 an example where both s1 and s2 match some code after the loop.
1295 we only want the witness from s2. *)
1296 setgfix f (triples_union (nub(drop_wits s1)) s2)
1297 ;;
1298
1299 let satAF dir m s reqst =
1300 inc satAF_calls;
1301 if !pNEW_INFO_OPT
1302 then
1303 let rec f y newinfo =
1304 inc_step();
1305 match newinfo with
1306 [] -> y
1307 | new_info ->
1308 let first = pre_forall dir m new_info y reqst in
1309 let res = triples_union first y in
1310 let new_info = setdiff res y in
1311 f res new_info in
1312 f s s
1313 else
1314 let f y =
1315 inc_step();
1316 let pre = pre_forall dir m y y reqst in
1317 triples_union s pre in
1318 setfix f s
1319
1320 let satAG dir ((_,_,states) as m) s reqst =
1321 inc satAG_calls;
1322 let f y =
1323 inc_step();
1324 let pre = pre_forall dir m y y reqst in
1325 triples_conj y pre in
1326 setgfix f s
1327
1328 let satEG dir ((_,_,states) as m) s reqst =
1329 inc satEG_calls;
1330 let f y =
1331 inc_step();
1332 let pre = pre_exist dir m y reqst in
1333 triples_conj y pre in
1334 setgfix f s
1335
1336 (* **************************************************************** *)
1337 (* Inner And - a way of dealing with multiple matches within a node *)
1338 (* **************************************************************** *)
1339 (* applied to the result of matching a node. collect witnesses when the
1340 states and environments are the same *)
1341 (* not a good idea, poses problem for unparsing, because don't realize that
1342 adjacent things come from different matches, leading to loss of newlines etc.
1343 exple struct I { ... - int x; + int y; ...} *)
1344
1345 let inner_and trips = trips (*
1346 let rec loop = function
1347 [] -> ([],[])
1348 | (s,th,w)::trips ->
1349 let (cur,acc) = loop trips in
1350 (match cur with
1351 (s',_,_)::_ when s = s' ->
1352 let rec loop' = function
1353 [] -> [(s,th,w)]
1354 | ((_,th',w') as t')::ts' ->
1355 (match conj_subst th th' with
1356 Some th'' -> (s,th'',union_wit w w')::ts'
1357 | None -> t'::(loop' ts')) in
1358 (loop' cur,acc)
1359 | _ -> ([(s,th,w)],cur@acc)) in
1360 let (cur,acc) =
1361 loop (List.sort state_compare trips) (* is this sort needed? *) in
1362 cur@acc *)
1363
1364 (* *************** *)
1365 (* Partial matches *)
1366 (* *************** *)
1367
1368 let filter_conj states unwanted partial_matches =
1369 let x =
1370 triples_conj (triples_complement states (unwitify unwanted))
1371 partial_matches in
1372 triples_conj (unwitify x) (triples_complement states x)
1373
1374 let strict_triples_conj strict states trips trips' =
1375 let res = triples_conj trips trips' in
1376 if !Flag_ctl.partial_match && strict = A.STRICT
1377 then
1378 let fail_left = filter_conj states trips trips' in
1379 let fail_right = filter_conj states trips' trips in
1380 let ors = triples_union fail_left fail_right in
1381 triples_union res ors
1382 else res
1383
1384 let strict_triples_conj_none strict states trips trips' =
1385 let res = triples_conj_none trips trips' in
1386 if !Flag_ctl.partial_match && strict = A.STRICT
1387 then
1388 let fail_left = filter_conj states trips trips' in
1389 let fail_right = filter_conj states trips' trips in
1390 let ors = triples_union fail_left fail_right in
1391 triples_union res ors
1392 else res
1393
1394 let left_strict_triples_conj strict states trips trips' =
1395 let res = triples_conj trips trips' in
1396 if !Flag_ctl.partial_match && strict = A.STRICT
1397 then
1398 let fail_left = filter_conj states trips trips' in
1399 triples_union res fail_left
1400 else res
1401
1402 let strict_A1 strict op failop dir ((_,_,states) as m) trips required_states =
1403 let res = op dir m trips required_states in
1404 if !Flag_ctl.partial_match && strict = A.STRICT
1405 then
1406 let states = mkstates states required_states in
1407 let fail = filter_conj states res (failop dir m trips required_states) in
1408 triples_union res fail
1409 else res
1410
1411 let strict_A2 strict op failop dir ((_,_,states) as m) trips trips'
1412 required_states =
1413 let res = op dir m trips trips' required_states in
1414 if !Flag_ctl.partial_match && strict = A.STRICT
1415 then
1416 let states = mkstates states required_states in
1417 let fail = filter_conj states res (failop dir m trips' required_states) in
1418 triples_union res fail
1419 else res
1420
1421 let strict_A2au strict op failop dir ((_,_,states) as m) trips trips'
1422 required_states print_graph =
1423 match op dir m trips trips' required_states print_graph with
1424 AUok res ->
1425 if !Flag_ctl.partial_match && strict = A.STRICT
1426 then
1427 let states = mkstates states required_states in
1428 let fail =
1429 filter_conj states res (failop dir m trips' required_states) in
1430 AUok (triples_union res fail)
1431 else AUok res
1432 | AUfailed res -> AUfailed res
1433
1434 (* ********************* *)
1435 (* Environment functions *)
1436 (* ********************* *)
1437
1438 let drop_wits required_states s phi =
1439 match required_states with
1440 None -> s
1441 | Some states -> List.filter (function (s,_,_) -> List.mem s states) s
1442
1443
1444 let print_required required =
1445 List.iter
1446 (function l ->
1447 Format.print_string "{";
1448 List.iter
1449 (function reqd ->
1450 print_generic_substitution reqd; Format.print_newline())
1451 l;
1452 Format.print_string "}";
1453 Format.print_newline())
1454 required
1455
1456 exception Too_long
1457
1458 let extend_required trips required =
1459 if !Flag_ctl.partial_match
1460 then required
1461 else
1462 if !pREQUIRED_ENV_OPT
1463 then
1464 (* make it a set *)
1465 let envs =
1466 List.fold_left
1467 (function rest ->
1468 function (_,t,_) -> if List.mem t rest then rest else t::rest)
1469 [] trips in
1470 let envs = if List.mem [] envs then [] else envs in
1471 match (envs,required) with
1472 ([],_) -> required
1473 | (envs,hd::tl) ->
1474 (try
1475 let hdln = List.length hd + 5 (* let it grow a little bit *) in
1476 let (_,merged) =
1477 let add x (ln,y) =
1478 if List.mem x y
1479 then (ln,y)
1480 else if ln + 1 > hdln then raise Too_long else (ln+1,x::y) in
1481 foldl
1482 (function rest ->
1483 function t ->
1484 foldl
1485 (function rest ->
1486 function r ->
1487 match conj_subst t r with
1488 None -> rest | Some th -> add th rest)
1489 rest hd)
1490 (0,[]) envs in
1491 merged :: tl
1492 with Too_long -> envs :: required)
1493 | (envs,_) -> envs :: required
1494 else required
1495
1496 let drop_required v required =
1497 if !pREQUIRED_ENV_OPT
1498 then
1499 let res =
1500 inner_setify
1501 (List.map
1502 (function l ->
1503 inner_setify
1504 (List.map (List.filter (function sub -> not(dom_sub sub = v))) l))
1505 required) in
1506 (* check whether an entry has become useless *)
1507 List.filter (function l -> not (List.exists (function x -> x = []) l)) res
1508 else required
1509
1510 (* no idea how to write this function ... *)
1511 let memo_label =
1512 (Hashtbl.create(50) : (P.t, (G.node * substitution) list) Hashtbl.t)
1513
1514 let satLabel label required p =
1515 let triples =
1516 if !pSATLABEL_MEMO_OPT
1517 then
1518 try
1519 let states_subs = Hashtbl.find memo_label p in
1520 List.map (function (st,th) -> (st,th,[])) states_subs
1521 with
1522 Not_found ->
1523 let triples = setify(label p) in
1524 Hashtbl.add memo_label p
1525 (List.map (function (st,th,_) -> (st,th)) triples);
1526 triples
1527 else setify(label p) in
1528 normalize
1529 (if !pREQUIRED_ENV_OPT
1530 then
1531 foldl
1532 (function rest ->
1533 function ((s,th,_) as t) ->
1534 if List.for_all
1535 (List.exists (function th' -> not(conj_subst th th' = None)))
1536 required
1537 then t::rest
1538 else rest)
1539 [] triples
1540 else triples)
1541
1542 let get_required_states l =
1543 if !pREQUIRED_STATES_OPT && not !Flag_ctl.partial_match
1544 then
1545 Some(inner_setify (List.map (function (s,_,_) -> s) l))
1546 else None
1547
1548 let get_children_required_states dir (grp,_,_) required_states =
1549 if !pREQUIRED_STATES_OPT && not !Flag_ctl.partial_match
1550 then
1551 match required_states with
1552 None -> None
1553 | Some states ->
1554 let fn =
1555 match dir with
1556 A.FORWARD -> G.successors
1557 | A.BACKWARD -> G.predecessors in
1558 Some (inner_setify (List.concat (List.map (fn grp) states)))
1559 else None
1560
1561 let reachable_table =
1562 (Hashtbl.create(50) : (G.node * A.direction, G.node list) Hashtbl.t)
1563
1564 (* like satEF, but specialized for get_reachable *)
1565 let reachsatEF dir (grp,_,_) s2 =
1566 let dirop =
1567 match dir with A.FORWARD -> G.successors | A.BACKWARD -> G.predecessors in
1568 let union = unionBy compare (=) in
1569 let rec f y = function
1570 [] -> y
1571 | new_info ->
1572 let (pre_collected,new_info) =
1573 List.partition (function Common.Left x -> true | _ -> false)
1574 (List.map
1575 (function x ->
1576 try Common.Left (Hashtbl.find reachable_table (x,dir))
1577 with Not_found -> Common.Right x)
1578 new_info) in
1579 let y =
1580 List.fold_left
1581 (function rest ->
1582 function Common.Left x -> union x rest
1583 | _ -> failwith "not possible")
1584 y pre_collected in
1585 let new_info =
1586 List.map
1587 (function Common.Right x -> x | _ -> failwith "not possible")
1588 new_info in
1589 let first = inner_setify (concatmap (dirop grp) new_info) in
1590 let new_info = setdiff first y in
1591 let res = new_info @ y in
1592 f res new_info in
1593 List.rev(f s2 s2) (* put root first *)
1594
1595 let get_reachable dir m required_states =
1596 match required_states with
1597 None -> None
1598 | Some states ->
1599 Some
1600 (List.fold_left
1601 (function rest ->
1602 function cur ->
1603 if List.mem cur rest
1604 then rest
1605 else
1606 Common.union_set
1607 (try Hashtbl.find reachable_table (cur,dir)
1608 with
1609 Not_found ->
1610 let states = reachsatEF dir m [cur] in
1611 Hashtbl.add reachable_table (cur,dir) states;
1612 states)
1613 rest)
1614 [] states)
1615
1616 let ctr = ref 0
1617 let new_var _ =
1618 let c = !ctr in
1619 ctr := !ctr + 1;
1620 Printf.sprintf "_c%d" c
1621
1622 (* **************************** *)
1623 (* End of environment functions *)
1624 (* **************************** *)
1625
1626 type ('code,'value) cell = Frozen of 'code | Thawed of 'value
1627
1628 let rec satloop unchecked required required_states
1629 ((grp,label,states) as m) phi env =
1630 let rec loop unchecked required required_states phi =
1631 (*Common.profile_code "satloop" (fun _ -> *)
1632 let res =
1633 match phi with
1634 A.False -> []
1635 | A.True -> triples_top states
1636 | A.Pred(p) -> satLabel label required p
1637 | A.Uncheck(phi1) ->
1638 let unchecked = if !pUNCHECK_OPT then true else false in
1639 loop unchecked required required_states phi1
1640 | A.Not(phi) ->
1641 let phires = loop unchecked required required_states phi in
1642 (*let phires =
1643 List.map (function (s,th,w) -> (s,th,[])) phires in*)
1644 triples_complement (mkstates states required_states)
1645 phires
1646 | A.Or(phi1,phi2) ->
1647 triples_union
1648 (loop unchecked required required_states phi1)
1649 (loop unchecked required required_states phi2)
1650 | A.SeqOr(phi1,phi2) ->
1651 let res1 = loop unchecked required required_states phi1 in
1652 let res2 = loop unchecked required required_states phi2 in
1653 let res1neg = unwitify res1 in
1654 triples_union res1
1655 (triples_conj
1656 (triples_complement (mkstates states required_states) res1neg)
1657 res2)
1658 | A.And(strict,phi1,phi2) ->
1659 (* phi1 is considered to be more likely to be [], because of the
1660 definition of asttoctl. Could use heuristics such as the size of
1661 the term *)
1662 let pm = !Flag_ctl.partial_match in
1663 (match (pm,loop unchecked required required_states phi1) with
1664 (false,[]) when !pLazyOpt -> []
1665 | (_,phi1res) ->
1666 let new_required = extend_required phi1res required in
1667 let new_required_states = get_required_states phi1res in
1668 (match (pm,loop unchecked new_required new_required_states phi2)
1669 with
1670 (false,[]) when !pLazyOpt -> []
1671 | (_,phi2res) ->
1672 strict_triples_conj strict
1673 (mkstates states required_states)
1674 phi1res phi2res))
1675 | A.AndAny(dir,strict,phi1,phi2) ->
1676 (* phi2 can appear anywhere that is reachable *)
1677 let pm = !Flag_ctl.partial_match in
1678 (match (pm,loop unchecked required required_states phi1) with
1679 (false,[]) -> []
1680 | (_,phi1res) ->
1681 let new_required = extend_required phi1res required in
1682 let new_required_states = get_required_states phi1res in
1683 let new_required_states =
1684 get_reachable dir m new_required_states in
1685 (match (pm,loop unchecked new_required new_required_states phi2)
1686 with
1687 (false,[]) -> phi1res
1688 | (_,phi2res) ->
1689 (match phi1res with
1690 [] -> (* !Flag_ctl.partial_match must be true *)
1691 if phi2res = []
1692 then []
1693 else
1694 let s = mkstates states required_states in
1695 List.fold_left
1696 (function a -> function b ->
1697 strict_triples_conj strict s a [b])
1698 [List.hd phi2res] (List.tl phi2res)
1699 | [(state,_,_)] ->
1700 let phi2res =
1701 List.map (function (s,e,w) -> [(state,e,w)]) phi2res in
1702 let s = mkstates states required_states in
1703 List.fold_left
1704 (function a -> function b ->
1705 strict_triples_conj strict s a b)
1706 phi1res phi2res
1707 | _ ->
1708 failwith
1709 "only one result allowed for the left arg of AndAny")))
1710 | A.HackForStmt(dir,strict,phi1,phi2) ->
1711 (* phi2 can appear anywhere that is reachable *)
1712 let pm = !Flag_ctl.partial_match in
1713 (match (pm,loop unchecked required required_states phi1) with
1714 (false,[]) -> []
1715 | (_,phi1res) ->
1716 let new_required = extend_required phi1res required in
1717 let new_required_states = get_required_states phi1res in
1718 let new_required_states =
1719 get_reachable dir m new_required_states in
1720 (match (pm,loop unchecked new_required new_required_states phi2)
1721 with
1722 (false,[]) -> phi1res
1723 | (_,phi2res) ->
1724 (* if there is more than one state, something about the
1725 environment has to ensure that the right triples of
1726 phi2 get associated with the triples of phi1.
1727 the asttoctl2 has to ensure that that is the case.
1728 these should thus be structural properties.
1729 env of phi2 has to be a proper subset of env of phi1
1730 to ensure all end up being consistent. no new triples
1731 should be generated. strict_triples_conj_none takes
1732 care of this.
1733 *)
1734 let s = mkstates states required_states in
1735 List.fold_left
1736 (function acc ->
1737 function (st,th,_) as phi2_elem ->
1738 let inverse =
1739 triples_complement [st] [(st,th,[])] in
1740 strict_triples_conj_none strict s acc
1741 (phi2_elem::inverse))
1742 phi1res phi2res))
1743 | A.InnerAnd(phi) ->
1744 inner_and(loop unchecked required required_states phi)
1745 | A.EX(dir,phi) ->
1746 let new_required_states =
1747 get_children_required_states dir m required_states in
1748 satEX dir m (loop unchecked required new_required_states phi)
1749 required_states
1750 | A.AX(dir,strict,phi) ->
1751 let new_required_states =
1752 get_children_required_states dir m required_states in
1753 let res = loop unchecked required new_required_states phi in
1754 strict_A1 strict satAX satEX dir m res required_states
1755 | A.EF(dir,phi) ->
1756 let new_required_states = get_reachable dir m required_states in
1757 satEF dir m (loop unchecked required new_required_states phi)
1758 new_required_states
1759 | A.AF(dir,strict,phi) ->
1760 if !Flag_ctl.loop_in_src_code
1761 then
1762 loop unchecked required required_states
1763 (A.AU(dir,strict,A.True,phi))
1764 else
1765 let new_required_states = get_reachable dir m required_states in
1766 let res = loop unchecked required new_required_states phi in
1767 strict_A1 strict satAF satEF dir m res new_required_states
1768 | A.EG(dir,phi) ->
1769 let new_required_states = get_reachable dir m required_states in
1770 satEG dir m (loop unchecked required new_required_states phi)
1771 new_required_states
1772 | A.AG(dir,strict,phi) ->
1773 let new_required_states = get_reachable dir m required_states in
1774 let res = loop unchecked required new_required_states phi in
1775 strict_A1 strict satAG satEF dir m res new_required_states
1776 | A.EU(dir,phi1,phi2) ->
1777 let new_required_states = get_reachable dir m required_states in
1778 (match loop unchecked required new_required_states phi2 with
1779 [] when !pLazyOpt -> []
1780 | s2 ->
1781 let new_required = extend_required s2 required in
1782 let s1 = loop unchecked new_required new_required_states phi1 in
1783 satEU dir m s1 s2 new_required_states
1784 (fun y ctr -> print_graph_c grp new_required_states y ctr phi))
1785 | A.AW(dir,strict,phi1,phi2) ->
1786 let new_required_states = get_reachable dir m required_states in
1787 (match loop unchecked required new_required_states phi2 with
1788 [] when !pLazyOpt -> []
1789 | s2 ->
1790 let new_required = extend_required s2 required in
1791 let s1 = loop unchecked new_required new_required_states phi1 in
1792 strict_A2 strict satAW satEF dir m s1 s2 new_required_states)
1793 | A.AU(dir,strict,phi1,phi2) ->
1794 (*Printf.printf "using AU\n"; flush stdout;*)
1795 let new_required_states = get_reachable dir m required_states in
1796 (match loop unchecked required new_required_states phi2 with
1797 [] when !pLazyOpt -> []
1798 | s2 ->
1799 let new_required = extend_required s2 required in
1800 let s1 = loop unchecked new_required new_required_states phi1 in
1801 let res =
1802 strict_A2au strict satAU satEF dir m s1 s2 new_required_states
1803 (fun y ctr ->
1804 print_graph_c grp new_required_states y ctr phi) in
1805 match res with
1806 AUok res -> res
1807 | AUfailed tmp_res ->
1808 (* found a loop, have to try AW *)
1809 (* the formula is
1810 A[E[phi1 U phi2] & phi1 W phi2]
1811 the and is nonstrict *)
1812 (* tmp_res is bigger than s2, so perhaps closer to s1 *)
1813 (*Printf.printf "using AW\n"; flush stdout;*)
1814 let s1 =
1815 triples_conj
1816 (satEU dir m s1 tmp_res new_required_states
1817 (* no graph, for the moment *)
1818 (fun y str -> ()))
1819 s1 in
1820 strict_A2 strict satAW satEF dir m s1 s2 new_required_states
1821 )
1822 | A.Implies(phi1,phi2) ->
1823 loop unchecked required required_states (A.Or(A.Not phi1,phi2))
1824 | A.Exists (keep,v,phi) ->
1825 let new_required = drop_required v required in
1826 triples_witness v unchecked (not keep)
1827 (loop unchecked new_required required_states phi)
1828 | A.Let(v,phi1,phi2) ->
1829 (* should only be used when the properties unchecked, required,
1830 and required_states are known to be the same or at least
1831 compatible between all the uses. this is not checked. *)
1832 let res = loop unchecked required required_states phi1 in
1833 satloop unchecked required required_states m phi2 ((v,res) :: env)
1834 | A.LetR(dir,v,phi1,phi2) ->
1835 (* should only be used when the properties unchecked, required,
1836 and required_states are known to be the same or at least
1837 compatible between all the uses. this is not checked. *)
1838 (* doesn't seem to be used any more *)
1839 let new_required_states = get_reachable dir m required_states in
1840 let res = loop unchecked required new_required_states phi1 in
1841 satloop unchecked required required_states m phi2 ((v,res) :: env)
1842 | A.Ref(v) ->
1843 let res = List.assoc v env in
1844 if unchecked
1845 then List.map (function (s,th,_) -> (s,th,[])) res
1846 else res
1847 | A.XX(phi) -> failwith "should have been removed" in
1848 if !Flag_ctl.bench > 0 then triples := !triples + (List.length res);
1849 let res = drop_wits required_states res phi (* ) *) in
1850 print_graph grp required_states res "" phi;
1851 res in
1852
1853 loop unchecked required required_states phi
1854 ;;
1855
1856
1857 (* SAT with tracking *)
1858 let rec sat_verbose_loop unchecked required required_states annot maxlvl lvl
1859 ((_,label,states) as m) phi env =
1860 let anno res children = (annot lvl phi res children,res) in
1861 let satv unchecked required required_states phi0 env =
1862 sat_verbose_loop unchecked required required_states annot maxlvl (lvl+1)
1863 m phi0 env in
1864 if (lvl > maxlvl) && (maxlvl > -1) then
1865 anno (satloop unchecked required required_states m phi env) []
1866 else
1867 let (child,res) =
1868 match phi with
1869 A.False -> anno [] []
1870 | A.True -> anno (triples_top states) []
1871 | A.Pred(p) ->
1872 Printf.printf "label\n"; flush stdout;
1873 anno (satLabel label required p) []
1874 | A.Uncheck(phi1) ->
1875 let unchecked = if !pUNCHECK_OPT then true else false in
1876 let (child1,res1) = satv unchecked required required_states phi1 env in
1877 Printf.printf "uncheck\n"; flush stdout;
1878 anno res1 [child1]
1879 | A.Not(phi1) ->
1880 let (child,res) =
1881 satv unchecked required required_states phi1 env in
1882 Printf.printf "not\n"; flush stdout;
1883 anno (triples_complement (mkstates states required_states) res) [child]
1884 | A.Or(phi1,phi2) ->
1885 let (child1,res1) =
1886 satv unchecked required required_states phi1 env in
1887 let (child2,res2) =
1888 satv unchecked required required_states phi2 env in
1889 Printf.printf "or\n"; flush stdout;
1890 anno (triples_union res1 res2) [child1; child2]
1891 | A.SeqOr(phi1,phi2) ->
1892 let (child1,res1) =
1893 satv unchecked required required_states phi1 env in
1894 let (child2,res2) =
1895 satv unchecked required required_states phi2 env in
1896 let res1neg =
1897 List.map (function (s,th,_) -> (s,th,[])) res1 in
1898 Printf.printf "seqor\n"; flush stdout;
1899 anno (triples_union res1
1900 (triples_conj
1901 (triples_complement (mkstates states required_states)
1902 res1neg)
1903 res2))
1904 [child1; child2]
1905 | A.And(strict,phi1,phi2) ->
1906 let pm = !Flag_ctl.partial_match in
1907 (match (pm,satv unchecked required required_states phi1 env) with
1908 (false,(child1,[])) ->
1909 Printf.printf "and\n"; flush stdout; anno [] [child1]
1910 | (_,(child1,res1)) ->
1911 let new_required = extend_required res1 required in
1912 let new_required_states = get_required_states res1 in
1913 (match (pm,satv unchecked new_required new_required_states phi2
1914 env) with
1915 (false,(child2,[])) ->
1916 Printf.printf "and\n"; flush stdout; anno [] [child1;child2]
1917 | (_,(child2,res2)) ->
1918 Printf.printf "and\n"; flush stdout;
1919 let res =
1920 strict_triples_conj strict
1921 (mkstates states required_states)
1922 res1 res2 in
1923 anno res [child1; child2]))
1924 | A.AndAny(dir,strict,phi1,phi2) ->
1925 let pm = !Flag_ctl.partial_match in
1926 (match (pm,satv unchecked required required_states phi1 env) with
1927 (false,(child1,[])) ->
1928 Printf.printf "and\n"; flush stdout; anno [] [child1]
1929 | (_,(child1,res1)) ->
1930 let new_required = extend_required res1 required in
1931 let new_required_states = get_required_states res1 in
1932 let new_required_states =
1933 get_reachable dir m new_required_states in
1934 (match (pm,satv unchecked new_required new_required_states phi2
1935 env) with
1936 (false,(child2,[])) ->
1937 Printf.printf "andany\n"; flush stdout;
1938 anno res1 [child1;child2]
1939 | (_,(child2,res2)) ->
1940 (match res1 with
1941 [] -> (* !Flag_ctl.partial_match must be true *)
1942 if res2 = []
1943 then anno [] [child1; child2]
1944 else
1945 let res =
1946 let s = mkstates states required_states in
1947 List.fold_left
1948 (function a -> function b ->
1949 strict_triples_conj strict s a [b])
1950 [List.hd res2] (List.tl res2) in
1951 anno res [child1; child2]
1952 | [(state,_,_)] ->
1953 let res2 =
1954 List.map (function (s,e,w) -> [(state,e,w)]) res2 in
1955 Printf.printf "andany\n"; flush stdout;
1956 let res =
1957 let s = mkstates states required_states in
1958 List.fold_left
1959 (function a -> function b ->
1960 strict_triples_conj strict s a b)
1961 res1 res2 in
1962 anno res [child1; child2]
1963 | _ ->
1964 failwith
1965 "only one result allowed for the left arg of AndAny")))
1966 | A.HackForStmt(dir,strict,phi1,phi2) ->
1967 let pm = !Flag_ctl.partial_match in
1968 (match (pm,satv unchecked required required_states phi1 env) with
1969 (false,(child1,[])) ->
1970 Printf.printf "and\n"; flush stdout; anno [] [child1]
1971 | (_,(child1,res1)) ->
1972 let new_required = extend_required res1 required in
1973 let new_required_states = get_required_states res1 in
1974 let new_required_states =
1975 get_reachable dir m new_required_states in
1976 (match (pm,satv unchecked new_required new_required_states phi2
1977 env) with
1978 (false,(child2,[])) ->
1979 Printf.printf "andany\n"; flush stdout;
1980 anno res1 [child1;child2]
1981 | (_,(child2,res2)) ->
1982 let res =
1983 let s = mkstates states required_states in
1984 List.fold_left
1985 (function acc ->
1986 function (st,th,_) as phi2_elem ->
1987 let inverse =
1988 triples_complement [st] [(st,th,[])] in
1989 strict_triples_conj_none strict s acc
1990 (phi2_elem::inverse))
1991 res1 res2 in
1992 anno res [child1; child2]))
1993 | A.InnerAnd(phi1) ->
1994 let (child1,res1) = satv unchecked required required_states phi1 env in
1995 Printf.printf "uncheck\n"; flush stdout;
1996 anno (inner_and res1) [child1]
1997 | A.EX(dir,phi1) ->
1998 let new_required_states =
1999 get_children_required_states dir m required_states in
2000 let (child,res) =
2001 satv unchecked required new_required_states phi1 env in
2002 Printf.printf "EX\n"; flush stdout;
2003 anno (satEX dir m res required_states) [child]
2004 | A.AX(dir,strict,phi1) ->
2005 let new_required_states =
2006 get_children_required_states dir m required_states in
2007 let (child,res) =
2008 satv unchecked required new_required_states phi1 env in
2009 Printf.printf "AX\n"; flush stdout;
2010 let res = strict_A1 strict satAX satEX dir m res required_states in
2011 anno res [child]
2012 | A.EF(dir,phi1) ->
2013 let new_required_states = get_reachable dir m required_states in
2014 let (child,res) =
2015 satv unchecked required new_required_states phi1 env in
2016 Printf.printf "EF\n"; flush stdout;
2017 anno (satEF dir m res new_required_states) [child]
2018 | A.AF(dir,strict,phi1) ->
2019 if !Flag_ctl.loop_in_src_code
2020 then
2021 satv unchecked required required_states
2022 (A.AU(dir,strict,A.True,phi1))
2023 env
2024 else
2025 (let new_required_states = get_reachable dir m required_states in
2026 let (child,res) =
2027 satv unchecked required new_required_states phi1 env in
2028 Printf.printf "AF\n"; flush stdout;
2029 let res =
2030 strict_A1 strict satAF satEF dir m res new_required_states in
2031 anno res [child])
2032 | A.EG(dir,phi1) ->
2033 let new_required_states = get_reachable dir m required_states in
2034 let (child,res) =
2035 satv unchecked required new_required_states phi1 env in
2036 Printf.printf "EG\n"; flush stdout;
2037 anno (satEG dir m res new_required_states) [child]
2038 | A.AG(dir,strict,phi1) ->
2039 let new_required_states = get_reachable dir m required_states in
2040 let (child,res) =
2041 satv unchecked required new_required_states phi1 env in
2042 Printf.printf "AG\n"; flush stdout;
2043 let res = strict_A1 strict satAG satEF dir m res new_required_states in
2044 anno res [child]
2045
2046 | A.EU(dir,phi1,phi2) ->
2047 let new_required_states = get_reachable dir m required_states in
2048 (match satv unchecked required new_required_states phi2 env with
2049 (child2,[]) ->
2050 Printf.printf "EU\n"; flush stdout;
2051 anno [] [child2]
2052 | (child2,res2) ->
2053 let new_required = extend_required res2 required in
2054 let (child1,res1) =
2055 satv unchecked new_required new_required_states phi1 env in
2056 Printf.printf "EU\n"; flush stdout;
2057 anno (satEU dir m res1 res2 new_required_states (fun y str -> ()))
2058 [child1; child2])
2059 | A.AW(dir,strict,phi1,phi2) ->
2060 failwith "should not be used" (*
2061 let new_required_states = get_reachable dir m required_states in
2062 (match satv unchecked required new_required_states phi2 env with
2063 (child2,[]) ->
2064 Printf.printf "AW %b\n" unchecked; flush stdout; anno [] [child2]
2065 | (child2,res2) ->
2066 let new_required = extend_required res2 required in
2067 let (child1,res1) =
2068 satv unchecked new_required new_required_states phi1 env in
2069 Printf.printf "AW %b\n" unchecked; flush stdout;
2070 let res =
2071 strict_A2 strict satAW satEF dir m res1 res2
2072 new_required_states in
2073 anno res [child1; child2]) *)
2074 | A.AU(dir,strict,phi1,phi2) ->
2075 let new_required_states = get_reachable dir m required_states in
2076 (match satv unchecked required new_required_states phi2 env with
2077 (child2,[]) ->
2078 Printf.printf "AU\n"; flush stdout; anno [] [child2]
2079 | (child2,s2) ->
2080 let new_required = extend_required s2 required in
2081 let (child1,s1) =
2082 satv unchecked new_required new_required_states phi1 env in
2083 Printf.printf "AU\n"; flush stdout;
2084 let res =
2085 strict_A2au strict satAU satEF dir m s1 s2 new_required_states
2086 (fun y str -> ()) in
2087 (match res with
2088 AUok res ->
2089 anno res [child1; child2]
2090 | AUfailed tmp_res ->
2091 (* found a loop, have to try AW *)
2092 (* the formula is
2093 A[E[phi1 U phi2] & phi1 W phi2]
2094 the and is nonstrict *)
2095 (* tmp_res is bigger than s2, so perhaps closer to s1 *)
2096 Printf.printf "AW\n"; flush stdout;
2097 let s1 =
2098 triples_conj
2099 (satEU dir m s1 tmp_res new_required_states
2100 (* no graph, for the moment *)
2101 (fun y str -> ()))
2102 s1 in
2103 let res =
2104 strict_A2 strict satAW satEF dir m s1 s2 new_required_states in
2105 anno res [child1; child2]))
2106 | A.Implies(phi1,phi2) ->
2107 satv unchecked required required_states
2108 (A.Or(A.Not phi1,phi2))
2109 env
2110 | A.Exists (keep,v,phi1) ->
2111 let new_required = drop_required v required in
2112 let (child,res) =
2113 satv unchecked new_required required_states phi1 env in
2114 Printf.printf "exists\n"; flush stdout;
2115 anno (triples_witness v unchecked (not keep) res) [child]
2116 | A.Let(v,phi1,phi2) ->
2117 let (child1,res1) =
2118 satv unchecked required required_states phi1 env in
2119 let (child2,res2) =
2120 satv unchecked required required_states phi2 ((v,res1) :: env) in
2121 anno res2 [child1;child2]
2122 | A.LetR(dir,v,phi1,phi2) ->
2123 let new_required_states = get_reachable dir m required_states in
2124 let (child1,res1) =
2125 satv unchecked required new_required_states phi1 env in
2126 let (child2,res2) =
2127 satv unchecked required required_states phi2 ((v,res1) :: env) in
2128 anno res2 [child1;child2]
2129 | A.Ref(v) ->
2130 Printf.printf "Ref\n"; flush stdout;
2131 let res = List.assoc v env in
2132 let res =
2133 if unchecked
2134 then List.map (function (s,th,_) -> (s,th,[])) res
2135 else res in
2136 anno res []
2137 | A.XX(phi) -> failwith "should have been removed" in
2138 let res1 = drop_wits required_states res phi in
2139 if not(res1 = res)
2140 then
2141 begin
2142 print_required_states required_states;
2143 print_state "after drop_wits" res1 end;
2144 (child,res1)
2145
2146 ;;
2147
2148 let sat_verbose annotate maxlvl lvl m phi =
2149 sat_verbose_loop false [] None annotate maxlvl lvl m phi []
2150
2151 (* Type for annotations collected in a tree *)
2152 type ('a) witAnnoTree = WitAnno of ('a * ('a witAnnoTree) list);;
2153
2154 let sat_annotree annotate m phi =
2155 let tree_anno l phi res chld = WitAnno(annotate l phi res,chld) in
2156 sat_verbose_loop false [] None tree_anno (-1) 0 m phi []
2157 ;;
2158
2159 (*
2160 let sat m phi = satloop m phi []
2161 ;;
2162 *)
2163
2164 let simpleanno l phi res =
2165 let pp s =
2166 Format.print_string ("\n" ^ s ^ "\n------------------------------\n");
2167 print_generic_algo (List.sort compare res);
2168 Format.print_string "\n------------------------------\n\n" in
2169 let pp_dir = function
2170 A.FORWARD -> ()
2171 | A.BACKWARD -> pp "^" in
2172 match phi with
2173 | A.False -> pp "False"
2174 | A.True -> pp "True"
2175 | A.Pred(p) -> pp ("Pred" ^ (Common.dump p))
2176 | A.Not(phi) -> pp "Not"
2177 | A.Exists(_,v,phi) -> pp ("Exists " ^ (Common.dump(v)))
2178 | A.And(_,phi1,phi2) -> pp "And"
2179 | A.AndAny(dir,_,phi1,phi2) -> pp "AndAny"
2180 | A.HackForStmt(dir,_,phi1,phi2) -> pp "HackForStmt"
2181 | A.Or(phi1,phi2) -> pp "Or"
2182 | A.SeqOr(phi1,phi2) -> pp "SeqOr"
2183 | A.Implies(phi1,phi2) -> pp "Implies"
2184 | A.AF(dir,_,phi1) -> pp "AF"; pp_dir dir
2185 | A.AX(dir,_,phi1) -> pp "AX"; pp_dir dir
2186 | A.AG(dir,_,phi1) -> pp "AG"; pp_dir dir
2187 | A.AW(dir,_,phi1,phi2)-> pp "AW"; pp_dir dir
2188 | A.AU(dir,_,phi1,phi2)-> pp "AU"; pp_dir dir
2189 | A.EF(dir,phi1) -> pp "EF"; pp_dir dir
2190 | A.EX(dir,phi1) -> pp "EX"; pp_dir dir
2191 | A.EG(dir,phi1) -> pp "EG"; pp_dir dir
2192 | A.EU(dir,phi1,phi2) -> pp "EU"; pp_dir dir
2193 | A.Let (x,phi1,phi2) -> pp ("Let"^" "^x)
2194 | A.LetR (dir,x,phi1,phi2) -> pp ("LetR"^" "^x); pp_dir dir
2195 | A.Ref(s) -> pp ("Ref("^s^")")
2196 | A.Uncheck(s) -> pp "Uncheck"
2197 | A.InnerAnd(s) -> pp "InnerAnd"
2198 | A.XX(phi1) -> pp "XX"
2199 ;;
2200
2201
2202 (* pad: Rene, you can now use the module pretty_print_ctl.ml to
2203 print a ctl formula more accurately if you want.
2204 Use the print_xxx provided in the different module to call
2205 Pretty_print_ctl.pp_ctl.
2206 *)
2207
2208 let simpleanno2 l phi res =
2209 begin
2210 Pretty_print_ctl.pp_ctl (P.print_predicate, SUB.print_mvar) false phi;
2211 Format.print_newline ();
2212 Format.print_string "----------------------------------------------------";
2213 Format.print_newline ();
2214 print_generic_algo (List.sort compare res);
2215 Format.print_newline ();
2216 Format.print_string "----------------------------------------------------";
2217 Format.print_newline ();
2218 Format.print_newline ();
2219 end
2220
2221
2222 (* ---------------------------------------------------------------------- *)
2223 (* Benchmarking *)
2224 (* ---------------------------------------------------------------------- *)
2225
2226 type optentry = bool ref * string
2227 type options = {label : optentry; unch : optentry;
2228 conj : optentry; compl1 : optentry; compl2 : optentry;
2229 newinfo : optentry;
2230 reqenv : optentry; reqstates : optentry}
2231
2232 let options =
2233 {label = (pSATLABEL_MEMO_OPT,"satlabel_memo_opt");
2234 unch = (pUNCHECK_OPT,"uncheck_opt");
2235 conj = (pTRIPLES_CONJ_OPT,"triples_conj_opt");
2236 compl1 = (pTRIPLES_COMPLEMENT_OPT,"triples_complement_opt");
2237 compl2 = (pTRIPLES_COMPLEMENT_SIMPLE_OPT,"triples_complement_simple_opt");
2238 newinfo = (pNEW_INFO_OPT,"new_info_opt");
2239 reqenv = (pREQUIRED_ENV_OPT,"required_env_opt");
2240 reqstates = (pREQUIRED_STATES_OPT,"required_states_opt")}
2241
2242 let baseline =
2243 [("none ",[]);
2244 ("label ",[options.label]);
2245 ("unch ",[options.unch]);
2246 ("unch and label ",[options.label;options.unch])]
2247
2248 let conjneg =
2249 [("conj ", [options.conj]);
2250 ("compl1 ", [options.compl1]);
2251 ("compl12 ", [options.compl1;options.compl2]);
2252 ("conj/compl12 ", [options.conj;options.compl1;options.compl2]);
2253 ("conj unch satl ", [options.conj;options.unch;options.label]);
2254 (*
2255 ("compl1 unch satl ", [options.compl1;options.unch;options.label]);
2256 ("compl12 unch satl ",
2257 [options.compl1;options.compl2;options.unch;options.label]); *)
2258 ("conj/compl12 unch satl ",
2259 [options.conj;options.compl1;options.compl2;options.unch;options.label])]
2260
2261 let path =
2262 [("newinfo ", [options.newinfo]);
2263 ("newinfo unch satl ", [options.newinfo;options.unch;options.label])]
2264
2265 let required =
2266 [("reqenv ", [options.reqenv]);
2267 ("reqstates ", [options.reqstates]);
2268 ("reqenv/states ", [options.reqenv;options.reqstates]);
2269 (* ("reqenv unch satl ", [options.reqenv;options.unch;options.label]);
2270 ("reqstates unch satl ",
2271 [options.reqstates;options.unch;options.label]);*)
2272 ("reqenv/states unch satl ",
2273 [options.reqenv;options.reqstates;options.unch;options.label])]
2274
2275 let all_options =
2276 [options.label;options.unch;options.conj;options.compl1;options.compl2;
2277 options.newinfo;options.reqenv;options.reqstates]
2278
2279 let all =
2280 [("all ",all_options)]
2281
2282 let all_options_but_path =
2283 [options.label;options.unch;options.conj;options.compl1;options.compl2;
2284 options.reqenv;options.reqstates]
2285
2286 let all_but_path = ("all but path ",all_options_but_path)
2287
2288 let counters =
2289 [(satAW_calls, "satAW", ref 0);
2290 (satAU_calls, "satAU", ref 0);
2291 (satEF_calls, "satEF", ref 0);
2292 (satAF_calls, "satAF", ref 0);
2293 (satEG_calls, "satEG", ref 0);
2294 (satAG_calls, "satAG", ref 0);
2295 (satEU_calls, "satEU", ref 0)]
2296
2297 let perms =
2298 map
2299 (function (opt,x) ->
2300 (opt,x,ref 0.0,ref 0,
2301 List.map (function _ -> (ref 0, ref 0, ref 0)) counters))
2302 [List.hd all;all_but_path]
2303 (*(all@baseline@conjneg@path@required)*)
2304
2305 exception Out
2306
2307 let rec iter fn = function
2308 1 -> fn()
2309 | n -> let _ = fn() in
2310 (Hashtbl.clear reachable_table;
2311 Hashtbl.clear memo_label;
2312 triples := 0;
2313 iter fn (n-1))
2314
2315 let copy_to_stderr fl =
2316 let i = open_in fl in
2317 let rec loop _ =
2318 Printf.fprintf stderr "%s\n" (input_line i);
2319 loop() in
2320 try loop() with _ -> ();
2321 close_in i
2322
2323 let bench_sat (_,_,states) fn =
2324 List.iter (function (opt,_) -> opt := false) all_options;
2325 let answers =
2326 concatmap
2327 (function (name,options,time,trips,counter_info) ->
2328 let iterct = !Flag_ctl.bench in
2329 if !time > float_of_int timeout then time := -100.0;
2330 if not (!time = -100.0)
2331 then
2332 begin
2333 Hashtbl.clear reachable_table;
2334 Hashtbl.clear memo_label;
2335 List.iter (function (opt,_) -> opt := true) options;
2336 List.iter (function (calls,_,save_calls) -> save_calls := !calls)
2337 counters;
2338 triples := 0;
2339 let res =
2340 let bef = Sys.time() in
2341 try
2342 Common.timeout_function timeout
2343 (fun () ->
2344 let bef = Sys.time() in
2345 let res = iter fn iterct in
2346 let aft = Sys.time() in
2347 time := !time +. (aft -. bef);
2348 trips := !trips + !triples;
2349 List.iter2
2350 (function (calls,_,save_calls) ->
2351 function (current_calls,current_cfg,current_max_cfg) ->
2352 current_calls :=
2353 !current_calls + (!calls - !save_calls);
2354 if (!calls - !save_calls) > 0
2355 then
2356 (let st = List.length states in
2357 current_cfg := !current_cfg + st;
2358 if st > !current_max_cfg
2359 then current_max_cfg := st))
2360 counters counter_info;
2361 [res])
2362 with
2363 Common.Timeout ->
2364 begin
2365 let aft = Sys.time() in
2366 time := -100.0;
2367 Printf.fprintf stderr "Timeout at %f on: %s\n"
2368 (aft -. bef) name;
2369 []
2370 end in
2371 List.iter (function (opt,_) -> opt := false) options;
2372 res
2373 end
2374 else [])
2375 perms in
2376 Printf.fprintf stderr "\n";
2377 match answers with
2378 [] -> []
2379 | res::rest ->
2380 (if not(List.for_all (function x -> x = res) rest)
2381 then
2382 (List.iter (print_state "a state") answers;
2383 Printf.printf "something doesn't work\n");
2384 res)
2385
2386 let print_bench _ =
2387 let iterct = !Flag_ctl.bench in
2388 if iterct > 0
2389 then
2390 (List.iter
2391 (function (name,options,time,trips,counter_info) ->
2392 Printf.fprintf stderr "%s Numbers: %f %d "
2393 name (!time /. (float_of_int iterct)) !trips;
2394 List.iter
2395 (function (calls,cfg,max_cfg) ->
2396 Printf.fprintf stderr "%d %d %d " (!calls / iterct) !cfg !max_cfg)
2397 counter_info;
2398 Printf.fprintf stderr "\n")
2399 perms)
2400
2401 (* ---------------------------------------------------------------------- *)
2402 (* preprocessing: ignore irrelevant functions *)
2403
2404 let preprocess (cfg,_,_) label = function
2405 [] -> true (* no information, try everything *)
2406 | l ->
2407 let sz = G.size cfg in
2408 let verbose_output pred = function
2409 [] ->
2410 Printf.printf "did not find:\n";
2411 P.print_predicate pred; Format.print_newline()
2412 | _ ->
2413 Printf.printf "found:\n";
2414 P.print_predicate pred; Format.print_newline();
2415 Printf.printf "but it was not enough\n" in
2416 let get_any verbose x =
2417 let res =
2418 try Hashtbl.find memo_label x
2419 with
2420 Not_found ->
2421 (let triples = label x in
2422 let filtered =
2423 List.map (function (st,th,_) -> (st,th)) triples in
2424 Hashtbl.add memo_label x filtered;
2425 filtered) in
2426 if verbose then verbose_output x res;
2427 not([] = res) in
2428 let get_all l =
2429 (* don't bother testing when there are more patterns than nodes *)
2430 if List.length l > sz-2
2431 then false
2432 else List.for_all (get_any false) l in
2433 if List.exists get_all l
2434 then true
2435 else
2436 (if !Flag_ctl.verbose_match
2437 then
2438 List.iter (List.iter (function x -> let _ = get_any true x in ()))
2439 l;
2440 false)
2441
2442 let filter_partial_matches trips =
2443 if !Flag_ctl.partial_match
2444 then
2445 let anynegwit = (* if any is neg, then all are *)
2446 List.exists (function A.NegWit _ -> true | A.Wit _ -> false) in
2447 let (bad,good) =
2448 List.partition (function (s,th,wit) -> anynegwit wit) trips in
2449 (match bad with
2450 [] -> ()
2451 | _ -> print_state "partial matches" bad; Format.print_newline());
2452 good
2453 else trips
2454
2455 (* ---------------------------------------------------------------------- *)
2456 (* Main entry point for engine *)
2457 let sat m phi reqopt =
2458 try
2459 (match !Flag_ctl.steps with
2460 None -> step_count := 0
2461 | Some x -> step_count := x);
2462 Hashtbl.clear reachable_table;
2463 Hashtbl.clear memo_label;
2464 let (x,label,states) = m in
2465 if (!Flag_ctl.bench > 0) or (preprocess m label reqopt)
2466 then
2467 ((* to drop when Yoann initialized this flag *)
2468 if List.exists (G.extract_is_loop x) states
2469 then Flag_ctl.loop_in_src_code := true;
2470 let m = (x,label,List.sort compare states) in
2471 let res =
2472 if(!Flag_ctl.verbose_ctl_engine)
2473 then
2474 let fn _ = snd (sat_annotree simpleanno2 m phi) in
2475 if !Flag_ctl.bench > 0
2476 then bench_sat m fn
2477 else fn()
2478 else
2479 let fn _ = satloop false [] None m phi [] in
2480 if !Flag_ctl.bench > 0
2481 then bench_sat m fn
2482 else Common.profile_code "ctl" (fun _ -> fn()) in
2483 let res = filter_partial_matches res in
2484 (*
2485 Printf.printf "steps: start %d, stop %d\n"
2486 (match !Flag_ctl.steps with Some x -> x | _ -> 0)
2487 !step_count;
2488 Printf.printf "triples: %d\n" !triples;
2489 print_state "final result" res;
2490 *)
2491 List.sort compare res)
2492 else
2493 (if !Flag_ctl.verbose_ctl_engine
2494 then Common.pr2 "missing something required";
2495 [])
2496 with Steps -> []
2497 ;;
2498
2499 (* ********************************************************************** *)
2500 (* End of Module: CTL_ENGINE *)
2501 (* ********************************************************************** *)
2502 end
2503 ;;