]> matita.cs.unibo.it Git - helm.git/blobdiff - helm/software/components/cic_unification/coercGraph.ml
huge commit regarding the grafite_status:
[helm.git] / helm / software / components / cic_unification / coercGraph.ml
index 2fa2c4b0c5ca4ba216534de62d26cbebb9e02bcd..9dfd6613d458016f25f0b520bd488f461acfe4e7 100644 (file)
@@ -91,7 +91,13 @@ let look_for_coercion_carr metasenv subst context src tgt =
   else
     let l = 
       CoercDb.find_coercion 
-        (fun (s,t) -> CoercDb.eq_carr s src && CoercDb.eq_carr t tgt) 
+        (fun (s,t) -> 
+          CoercDb.eq_carr s src && 
+          match t, tgt with
+          | CoercDb.Sort Cic.Prop, CoercDb.Sort Cic.Prop 
+          | CoercDb.Sort Cic.Set, CoercDb.Sort Cic.Set 
+          | CoercDb.Sort _, CoercDb.Sort (Cic.Type _|Cic.CProp _) -> true
+          | _ -> CoercDb.eq_carr t tgt) 
     in
     pp_l "precise" l;
      (match l with
@@ -130,34 +136,93 @@ let source_of t =
 ;;
 
 let generate_dot_file () =
+  let l = CoercDb.to_list (CoercDb.dump ()) in
   let module Pp = GraphvizPp.Dot in
   let buf = Buffer.create 10240 in
   let fmt = Format.formatter_of_buffer buf in
   Pp.header ~node_attrs:["fontsize", "9"; "width", ".4"; "height", ".4"]
     ~edge_attrs:["fontsize", "10"] fmt;
-  let l = CoercDb.to_list () in
-  let pp_description carr =
-    match carr with
-    | CoercDb.Uri uri ->
-        Pp.node (CoercDb.string_of_carr carr)
-          ~attrs:["href", UriManager.string_of_uri uri] fmt 
-    | _ -> ()
+  if List.exists (fun (_,t,_) -> CoercDb.string_of_carr t = "Type") l then
+    Format.fprintf fmt "subgraph cluster_rest { style=\"filled\";
+    color=\"white\"; label=<%s>; labelloc=\"b\"; %s; }\n" 
+       ("<FONT POINT-SIZE=\"10.0\"><TABLE BORDER=\"1\" CELLBORDER=\"1\" >
+         <TR><TD BGCOLOR=\"gray95\">Source</TD>
+         <TD BGCOLOR=\"gray95\">Target</TD>
+         <TD BGCOLOR=\"gray95\">Arrows</TD></TR>"^
+       String.concat "</TR>"   
+         (List.map 
+           (fun (src,tgt,ul) -> 
+            let src_name = CoercDb.string_of_carr src in
+            let tgt_name = CoercDb.string_of_carr tgt in
+            let names = 
+              List.map (fun (u,_,_) -> 
+                UriManager.name_of_uri u ^ 
+                  (match CicEnvironment.get_obj CicUniv.empty_ugraph u with
+                  | Cic.Constant (_,Some (Cic.Const (u',_)),_,_,attrs), _
+                    when List.exists ((=) (`Flavour `Variant)) attrs -> "*"
+                  | _ -> "")
+              ) ul 
+            in
+            "<TR><TD>"  ^ src_name ^ "</TD><TD>" ^ tgt_name ^ "</TD><TD>" ^
+            String.concat ",&nbsp;" names ^ "</TD>")
+         (List.sort (fun (x,y,_) (x1,y1,_) -> 
+             let rc = compare x x1 in
+             if rc = 0 then compare y y1 else rc) l))
+       ^ "</TR></TABLE></FONT>")
+       (String.concat ";" ["Type"]);
+  let type_uri u = 
+    let ty, _ = 
+      CicTypeChecker.type_of_aux' [] [] (CicUtil.term_of_uri u)
+      CicUniv.oblivion_ugraph
+    in
+      ty
+  in
+  let deref_coercion u =
+   match CicEnvironment.get_obj CicUniv.empty_ugraph u with
+   | Cic.Constant (_,Some (Cic.Const (u',_)),_,_,attrs), _
+     when List.exists ((=) (`Flavour `Variant)) attrs ->
+       UriManager.name_of_uri u'
+   | Cic.Constant (_,Some t,_,_,_), _ when
+       let rec is_id = function 
+         | Cic.Lambda (_,_,t) -> is_id t
+         | Cic.Rel _ -> true
+         | _ -> false
+         in is_id t -> "ID"
+   | _ -> UriManager.name_of_uri u
   in
   List.iter
     (fun (src, tgt, ul) ->
-      let src_name = CoercDb.string_of_carr src in
-      let tgt_name = CoercDb.string_of_carr tgt in
-      pp_description src;
-      pp_description tgt;
       List.iter
-        (fun (u,saturations,_) ->
+        (fun (u,saturations,cpos) ->
+          let ty = type_uri u in
+          let src_name, tgt_name = 
+            let rec aux ctx cpos t =
+              match cpos, t with
+              | 0,Cic.Prod (_,src,tgt) ->
+                  CicPp.pp src ctx, tgt, (Some (Cic.Name "_")::ctx)
+              | 0,t -> CicPp.pp t ctx, Cic.Implicit None, []
+              | n,Cic.Prod (_,_,tgt) -> aux (Some (Cic.Name "_")::ctx) (n-1) tgt
+              | _ -> assert false
+            in
+            let ssrc, rest, ctx = aux [] cpos ty in
+            let stgt, rest, _ = aux ctx saturations rest in
+            let stgt = 
+              if rest <> Cic.Implicit None then
+                match tgt with 
+                | CoercDb.Fun _ -> CoercDb.string_of_carr tgt
+                | _ -> assert false
+              else
+                stgt
+            in
+            ssrc, stgt
+          in
+          Pp.node src_name fmt;
+          Pp.node tgt_name fmt;
           Pp.edge src_name tgt_name
             ~attrs:[ "label",
-                     (UriManager.name_of_uri u ^
-                      if saturations = 0 then
-                       ""
-                      else
-                       "(" ^ string_of_int saturations ^ ")");
+                 (deref_coercion u ^
+                  if saturations = 0 then ""
+                  else "(" ^ string_of_int saturations ^ ")");
               "href", UriManager.string_of_uri u ]
             fmt)
         ul)
@@ -166,20 +231,6 @@ let generate_dot_file () =
   Buffer.contents buf
 ;;
     
-let is_composite t =
-  try
-    let uri = 
-      match t with 
-      | Cic.Appl (he::_) -> CicUtil.uri_of_term he
-      | _ -> CicUtil.uri_of_term t
-    in
-    match CicEnvironment.get_obj CicUniv.oblivion_ugraph uri with
-    | Cic.Constant (_,_, _, _, attrs),_  ->
-        List.exists (function `Class (`Coercion _) -> true | _ -> false) attrs
-    | _ -> false
-  with Invalid_argument _ -> false
-;;
-
 let coerced_arg l =
   match l with
   | [] | [_] -> None
@@ -212,7 +263,7 @@ let splat e l = List.map (fun (x1,x2,_) -> e, Some (x1,x2)) l;;
 
 (* : carr -> (carr * uri option) where the option is always Some *)
 let get_coercions_to carr = 
-  let l = CoercDb.to_list () in
+  let l = CoercDb.to_list (CoercDb.dump ()) in
   let splat_coercion_to carr (src,tgt,cl) =
     if CoercDb.eq_carr tgt carr then Some (splat src cl) else None
   in
@@ -222,7 +273,7 @@ let get_coercions_to carr =
 
 (* : carr -> (carr * uri option) where the option is always Some *)
 let get_coercions_from carr = 
-  let l = CoercDb.to_list () in
+  let l = CoercDb.to_list (CoercDb.dump ()) in
   let splat_coercion_from carr (src,tgt,cl) =
     if CoercDb.eq_carr src carr then Some (splat tgt cl) else None
   in
@@ -253,13 +304,19 @@ let lb (c,_,_) =
 
 (* given the set { (s,u1,u2) | u1:s->t1 /\ u2:s->t2 } removes the elements 
  * (s,_,_) such that (s',_,_) is in the set and there exists a coercion s->s' *)
-let rec min acc = function
+let rec min acc skipped = function
   | c::tl -> 
-    if List.exists (lb c) (tl@acc) then min acc tl else min (c::acc) tl
-  | [] -> acc
+    if List.exists (lb c) (tl@acc) 
+    then min acc (c::skipped) tl else min (c::acc) skipped tl
+  | [] -> acc, skipped
+;;
+
+
+let sort l = 
+  let low, high = min [] [] l in low @ high
 ;;
 
-let meets metasenv subst context left right =
+let meets metasenv subst context (grow_left,left) (grow_right,right) =
   let saturate metasenv uo =
     match uo with 
     | None -> metasenv, None
@@ -273,7 +330,9 @@ let meets metasenv subst context left right =
       let metasenv, uo1 = saturate metasenv uo1 in
       let metasenv, uo2 = saturate metasenv uo2 in
       c,metasenv, uo1, uo2)
-    (min [] (intersect (grow left) (grow right)))
+    (sort (intersect 
+      (if grow_left then grow left else [left,None]) 
+      (if grow_right then grow right else [right,None])))
 ;;
 
 (* EOF *)