2 ||M|| This file is part of HELM, an Hypertextual, Electronic
3 ||A|| Library of Mathematics, developed at the Computer Science
4 ||T|| Department, University of Bologna, Italy.
6 ||T|| HELM is free software; you can redistribute it and/or
7 ||A|| modify it under the terms of the GNU General Public License
8 \ / version 2 or (at your option) any later version.
9 \ / This software is distributed as is, NO WARRANTY.
10 V_______________________________________________________________ *)
15 module Ref = NReference
17 exception CircularDependency of string Lazy.t;;
18 exception ObjectNotFound of string Lazy.t;;
19 exception BadDependency of string Lazy.t * exn;;
20 exception BadConstraint of string Lazy.t;;
25 HExtlib.list_uniq ~eq:(fun (b1,u1) (b2,u2) -> b1=b2 && NUri.eq u1 u2)
26 (List.sort (fun (b1,u1) (b2,u2) ->
27 let res = compare b1 b2 in if res = 0 then NUri.compare u1 u2 else res)
30 let le_constraints = ref [] (* strict,a,b *)
32 let rec le_path_uri avoid strict a b =
33 (not strict && NUri.eq a b) ||
36 NUri.eq y b && not (List.exists (NUri.eq x) avoid) &&
37 le_path_uri (x::avoid) (strict && not strict') a x
41 let leq_path a b = le_path_uri [b] (fst a) (snd a) b;;
43 let universe_leq a b =
45 | a,[(false,b)] -> List.for_all (fun a -> leq_path a b) a
48 (lazy "trying to check if a universe is less or equal than an inferred universe"))
52 | [(false,_)], [(false,_)] -> universe_leq b a && universe_leq a b
54 | [(false,_)],_ -> false
57 (lazy "trying to check if two inferred universes are equal"))
60 let pp_constraint b x y =
61 NUri.name_of_uri x ^ (if b then " < " else " <= ") ^ NUri.name_of_uri y
64 let pp_constraints () =
65 String.concat "\n" (List.map (fun (b,x,y) -> pp_constraint b x y) !le_constraints)
68 let universes = ref [];;
70 let add_constraint strict a b =
72 | [false,a2],[false,b2] ->
73 if not (le_path_uri [] strict a2 b2) then (
74 if le_path_uri [] (not strict) b2 a2 then
75 (raise(BadConstraint(lazy("universe inconsistency adding "^pp_constraint strict a2 b2
76 ^ " to:\n" ^ pp_constraints ()))));
77 universes := a2 :: b2 ::
78 List.filter (fun x -> not (NUri.eq x a2 || NUri.eq x b2)) !universes;
79 le_constraints := (strict,a2,b2) :: !le_constraints)
80 | _ -> raise (BadConstraint
81 (lazy "trying to add a constraint on an inferred universe"))
88 let bigger_than acc (s1,n1) = List.filter (le_path_uri [] s1 n1) acc in
89 let solutions = List.fold_left bigger_than !universes l in
90 let rec aux = function
93 if List.exists (fun x -> le_path_uri [] true x u) solutions then aux tl
101 let typecheck_obj,already_set = ref (fun _ -> assert false), ref false;;
102 let set_typecheck_obj f =
112 let cache = NUri.UriHash.create 313;;
113 let frozen_list = ref [];;
115 exception Propagate of NUri.uri * exn;;
117 let get_checked_obj u =
118 if List.exists (fun (k,_) -> NUri.eq u k) !frozen_list
120 raise (CircularDependency (lazy (NUri.string_of_uri u)))
123 try NUri.UriHash.find cache u
126 let saved_frozen_list = !frozen_list in
129 try NCicLibrary.get_obj u
131 NCicLibrary.ObjectNotFound m -> raise (ObjectNotFound m)
133 frozen_list := (u,obj)::saved_frozen_list;
135 frozen_list := saved_frozen_list;
136 let obj = `WellTyped obj in
137 NUri.UriHash.add cache u obj;
141 frozen_list := saved_frozen_list;
143 | Propagate (u',old_exn) as e' ->
144 frozen_list := saved_frozen_list;
145 let exn = `Exn (BadDependency (lazy (NUri.string_of_uri u ^
146 " depends (recursively) on " ^ NUri.string_of_uri u' ^
147 " which is not well-typed"),
148 match old_exn with BadDependency (_,e) -> e | _ -> old_exn)) in
149 NUri.UriHash.add cache u exn;
150 if saved_frozen_list = [] then
155 frozen_list := saved_frozen_list;
157 NUri.UriHash.add cache u exn;
158 if saved_frozen_list = [] then
161 raise (Propagate (u,e))
168 let get_checked_decl = function
169 | Ref.Ref (uri, Ref.Decl) ->
170 (match get_checked_obj uri with
171 | _,height,_,_, C.Constant (rlv,name,None,ty,att) ->
172 rlv,name,ty,att,height
173 | _,_,_,_, C.Constant (_,_,Some _,_,_) ->
174 prerr_endline "get_checked_decl on a definition"; assert false
175 | _ -> prerr_endline "get_checked_decl on a non decl 2"; assert false)
176 | _ -> prerr_endline "get_checked_decl on a non decl"; assert false
179 let get_checked_def = function
180 | Ref.Ref (uri, Ref.Def _) ->
181 (match get_checked_obj uri with
182 | _,height,_,_, C.Constant (rlv,name,Some bo,ty,att) ->
183 rlv,name,bo,ty,att,height
184 | _,_,_,_, C.Constant (_,_,None,_,_) ->
185 prerr_endline "get_checked_def on an axiom"; assert false
186 | _ -> prerr_endline "get_checked_def on a non def 2"; assert false)
187 | _ -> prerr_endline "get_checked_def on a non def"; assert false
190 let get_checked_indtys = function
191 | Ref.Ref (uri, (Ref.Ind (_,n,_)|Ref.Con (n,_,_))) ->
192 (match get_checked_obj uri with
193 | _,_,_,_, C.Inductive (inductive,leftno,tys,att) ->
194 inductive,leftno,tys,att,n
195 | _ -> prerr_endline "get_checked_indtys on a non ind 2"; assert false)
196 | _ -> prerr_endline "get_checked_indtys on a non ind"; assert false
199 let get_checked_fixes_or_cofixes = function
200 | Ref.Ref (uri, (Ref.Fix _|Ref.CoFix _))->
201 (match get_checked_obj uri with
202 | _,height,_,_, C.Fixpoint (_,funcs,att) ->
204 | _ ->prerr_endline "get_checked_(co)fix on a non (co)fix 2";assert false)
205 | _ -> prerr_endline "get_checked_(co)fix on a non (co)fix"; assert false
208 let get_relevance (Ref.Ref (_, infos) as r) =
210 Ref.Def _ -> let res,_,_,_,_,_ = get_checked_def r in res
211 | Ref.Decl -> let res,_,_,_,_ = get_checked_decl r in res
213 let _,_,tl,_,n = get_checked_indtys r in
214 let res,_,_,_ = List.nth tl n in
217 let _,_,tl,_,n = get_checked_indtys r in
218 let _,_,_,cl = List.nth tl n in
219 let res,_,_ = List.nth cl (i - 1) in
221 | Ref.Fix (fixno,_,_)
223 let fl,_,_ = get_checked_fixes_or_cofixes r in
224 let res,_,_,_,_ = List.nth fl fixno in
230 assert (!frozen_list = []);
231 NUri.UriHash.clear cache