]> matita.cs.unibo.it Git - helm.git/blob - matitaB/matita/matitaGui.ml
Update online helper entries
[helm.git] / matitaB / matita / matitaGui.ml
1 (* Copyright (C) 2004-2005, HELM Team.
2  * 
3  * This file is part of HELM, an Hypertextual, Electronic
4  * Library of Mathematics, developed at the Computer Science
5  * Department, University of Bologna, Italy.
6  * 
7  * HELM is free software; you can redistribute it and/or
8  * modify it under the terms of the GNU General Public License
9  * as published by the Free Software Foundation; either version 2
10  * of the License, or (at your option) any later version.
11  * 
12  * HELM 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 HELM; if not, write to the Free Software
19  * Foundation, Inc., 59 Temple Place - Suite 330, Boston,
20  * MA  02111-1307, USA.
21  * 
22  * For details, see the HELM World-Wide-Web page,
23  * http://helm.cs.unibo.it/
24  *)
25
26 (* $Id$ *)
27
28 open Printf
29
30 open MatitaGeneratedGui
31 open MatitaGtkMisc
32 open MatitaMisc
33
34 exception Found of int
35
36 let all_disambiguation_passes = ref false
37
38 (* this is a shit and should be changed :-{ *)
39 let interactive_uri_choice
40   ?(selection_mode:[`SINGLE|`MULTIPLE] = `MULTIPLE) ?(title = "")
41   ?(msg = "") ?(nonvars_button = false) ?(hide_uri_entry=false) 
42   ?(hide_try=false) ?(ok_label="_Auto") ?(ok_action:[`SELECT|`AUTO] = `AUTO) 
43   ?copy_cb ()
44   ~id uris
45 =
46   if (selection_mode <> `SINGLE) &&
47     (Helm_registry.get_opt_default Helm_registry.get_bool ~default:true "matita.auto_disambiguation")
48   then
49     uris
50   else begin
51     let dialog = new uriChoiceDialog () in
52     if hide_uri_entry then
53       dialog#uriEntryHBox#misc#hide ();
54     if hide_try then
55       begin
56       dialog#uriChoiceSelectedButton#misc#hide ();
57       dialog#uriChoiceConstantsButton#misc#hide ();
58       end;
59     dialog#okLabel#set_label ok_label;  
60     dialog#uriChoiceTreeView#selection#set_mode
61       (selection_mode :> Gtk.Tags.selection_mode);
62     let model = new stringListModel dialog#uriChoiceTreeView in
63     let choices = ref None in
64     (match copy_cb with
65     | None -> ()
66     | Some cb ->
67         dialog#copyButton#misc#show ();
68         connect_button dialog#copyButton 
69         (fun _ ->
70           match model#easy_selection () with
71           | [u] -> (cb u)
72           | _ -> ()));
73     dialog#uriChoiceDialog#set_title title;
74     dialog#uriChoiceLabel#set_text msg;
75     List.iter model#easy_append (List.map NReference.string_of_reference uris);
76     dialog#uriChoiceConstantsButton#misc#set_sensitive nonvars_button;
77     let return v =
78       choices := v;
79       dialog#uriChoiceDialog#destroy ();
80       GMain.Main.quit ()
81     in
82     ignore (dialog#uriChoiceDialog#event#connect#delete (fun _ -> true));
83     connect_button dialog#uriChoiceConstantsButton (fun _ ->
84       return (Some uris));
85     if ok_action = `AUTO then
86       connect_button dialog#uriChoiceAutoButton (fun _ ->
87         Helm_registry.set_bool "matita.auto_disambiguation" true;
88         return (Some uris))
89     else
90       connect_button dialog#uriChoiceAutoButton (fun _ ->
91         match model#easy_selection () with
92         | [] -> ()
93         | uris -> return (Some (List.map NReference.reference_of_string uris)));
94     connect_button dialog#uriChoiceSelectedButton (fun _ ->
95       match model#easy_selection () with
96       | [] -> ()
97       | uris -> return (Some (List.map NReference.reference_of_string uris)));
98     connect_button dialog#uriChoiceAbortButton (fun _ -> return None);
99     dialog#uriChoiceDialog#show ();
100     GtkThread.main ();
101     (match !choices with 
102     | None -> raise MatitaTypes.Cancel
103     | Some uris -> uris)
104   end
105
106
107 class console ~(buffer: GText.buffer) () =
108   object (self)
109     val error_tag   = buffer#create_tag [ `FOREGROUND "red" ]
110     val warning_tag = buffer#create_tag [ `FOREGROUND "orange" ]
111     val message_tag = buffer#create_tag []
112     val debug_tag   = buffer#create_tag [ `FOREGROUND "#888888" ]
113     method message s = buffer#insert ~iter:buffer#end_iter ~tags:[message_tag] s
114     method error s   = buffer#insert ~iter:buffer#end_iter ~tags:[error_tag] s
115     method warning s = buffer#insert ~iter:buffer#end_iter ~tags:[warning_tag] s
116     method debug s   = buffer#insert ~iter:buffer#end_iter ~tags:[debug_tag] s
117     method clear () =
118       buffer#delete ~start:buffer#start_iter ~stop:buffer#end_iter
119     method log_callback (tag: HLog.log_tag) s =
120       let s = Pcre.replace ~pat:"\e\\[0;3.m([^\e]+)\e\\[0m" ~templ:"$1" s in
121       match tag with
122       | `Debug -> self#debug (s ^ "\n")
123       | `Error -> self#error (s ^ "\n")
124       | `Message -> self#message (s ^ "\n")
125       | `Warning -> self#warning (s ^ "\n")
126   end
127         
128 let clean_current_baseuri status = 
129   LibraryClean.clean_baseuris [status#baseuri]
130
131 let save_moo status = 
132   let script = MatitaScript.current () in
133   let baseuri = status#baseuri in
134   match script#bos, script#eos with
135   | true, _ -> ()
136   | _, true ->
137      GrafiteTypes.Serializer.serialize ~baseuri:(NUri.uri_of_string baseuri)
138       status
139   | _ -> clean_current_baseuri status 
140 ;;
141     
142 let ask_unsaved parent filename =
143   MatitaGtkMisc.ask_confirmation 
144     ~parent ~title:"Unsaved work!" 
145     ~message:("Script <b>" ^ filename ^ "</b> is modified.!\n\n"^
146          "<i>Do you want to save the script before continuing?</i>")
147     ()
148
149 class interpErrorModel =
150   let cols = new GTree.column_list in
151   let id_col = cols#add Gobject.Data.string in
152   let dsc_col = cols#add Gobject.Data.string in
153   let interp_no_col = cols#add Gobject.Data.caml in
154   let tree_store = GTree.tree_store cols in
155   let id_renderer = GTree.cell_renderer_text [], ["text", id_col] in
156   let dsc_renderer = GTree.cell_renderer_text [], ["text", dsc_col] in
157   let id_view_col = GTree.view_column ~renderer:id_renderer () in
158   let dsc_view_col = GTree.view_column ~renderer:dsc_renderer () in
159   fun (tree_view: GTree.view) choices ->
160     object
161       initializer
162         tree_view#set_model (Some (tree_store :> GTree.model));
163         ignore (tree_view#append_column id_view_col);
164         ignore (tree_view#append_column dsc_view_col);
165         tree_store#clear ();
166         let idx1 = ref ~-1 in
167         List.iter
168           (fun _,lll ->
169             incr idx1;
170             let loc_row =
171              if List.length choices = 1 then
172               None
173              else
174               (let loc_row = tree_store#append () in
175                 begin
176                  match lll with
177                     [passes,envs_and_diffs,_,_] ->
178                       tree_store#set ~row:loc_row ~column:id_col
179                        ("Error location " ^ string_of_int (!idx1+1) ^
180                         ", error message " ^ string_of_int (!idx1+1) ^ ".1" ^
181                         " (in passes " ^
182                         String.concat " " (List.map string_of_int passes) ^
183                         ")");
184                       tree_store#set ~row:loc_row ~column:interp_no_col
185                        (!idx1,Some 0,None);
186                   | _ ->
187                     tree_store#set ~row:loc_row ~column:id_col
188                      ("Error location " ^ string_of_int (!idx1+1));
189                     tree_store#set ~row:loc_row ~column:interp_no_col
190                      (!idx1,None,None);
191                 end ;
192                 Some loc_row) in
193             let idx2 = ref ~-1 in
194              List.iter
195               (fun passes,envs_and_diffs,_,_ ->
196                 incr idx2;
197                 let msg_row =
198                  if List.length lll = 1 then
199                   loc_row
200                  else
201                   let msg_row = tree_store#append ?parent:loc_row () in
202                    (tree_store#set ~row:msg_row ~column:id_col
203                      ("Error message " ^ string_of_int (!idx1+1) ^ "." ^
204                       string_of_int (!idx2+1) ^
205                       " (in passes " ^
206                       String.concat " " (List.map string_of_int passes) ^
207                       ")");
208                     tree_store#set ~row:msg_row ~column:interp_no_col
209                      (!idx1,Some !idx2,None);
210                     Some msg_row) in
211                 let idx3 = ref ~-1 in
212                 List.iter
213                  (fun (passes,env,_) ->
214                    incr idx3;
215                    let interp_row =
216                     match envs_and_diffs with
217                        _::_::_ ->
218                         let interp_row = tree_store#append ?parent:msg_row () in
219                         tree_store#set ~row:interp_row ~column:id_col
220                           ("Interpretation " ^ string_of_int (!idx3+1) ^
221                            " (in passes " ^
222                            String.concat " " (List.map string_of_int passes) ^
223                            ")");
224                         tree_store#set ~row:interp_row ~column:interp_no_col
225                          (!idx1,Some !idx2,Some !idx3);
226                         Some interp_row
227                      | [_] -> msg_row
228                      | [] -> assert false
229                    in
230                     List.iter
231                      (fun (_, id, dsc) ->
232                        let row = tree_store#append ?parent:interp_row () in
233                        tree_store#set ~row ~column:id_col id;
234                        tree_store#set ~row ~column:dsc_col dsc;
235                        tree_store#set ~row ~column:interp_no_col
236                         (!idx1,Some !idx2,Some !idx3)
237                      ) env
238                  ) envs_and_diffs
239               ) lll ;
240              if List.length lll > 1 then
241               HExtlib.iter_option
242                (fun p -> tree_view#expand_row (tree_store#get_path p))
243                loc_row
244           ) choices
245
246       method get_interp_no tree_path =
247         let iter = tree_store#get_iter tree_path in
248         tree_store#get ~row:iter ~column:interp_no_col
249     end
250
251 exception UseLibrary;;
252
253 let interactive_error_interp ~all_passes
254   (source_buffer:GSourceView2.source_buffer) notify_exn offset errorll filename
255
256   (* hook to save a script for each disambiguation error *)
257   if false then
258    (let text =
259      source_buffer#get_text ~start:source_buffer#start_iter
260       ~stop:source_buffer#end_iter () in
261     let md5 = Digest.to_hex (Digest.string text) in
262     let filename =
263      Filename.chop_extension filename ^ ".error." ^ md5 ^ ".ma"  in
264     let ch = open_out filename in
265      output_string ch text;
266     close_out ch
267    );
268   assert (List.flatten errorll <> []);
269   let errorll' =
270    let remove_non_significant =
271      List.filter (fun (_env,_diff,_loc_msg,significant) -> significant) in
272    let annotated_errorll () =
273     List.rev
274      (snd
275        (List.fold_left (fun (pass,res) item -> pass+1,(pass+1,item)::res) (0,[])
276          errorll)) in
277    if all_passes then annotated_errorll () else
278      let safe_list_nth l n = try List.nth l n with Failure _ -> [] in
279     (* We remove passes 1,2 and 5,6 *)
280      let res =
281       (1,[])::(2,[])
282       ::(3,remove_non_significant (safe_list_nth errorll 2))
283       ::(4,remove_non_significant (safe_list_nth errorll 3))
284       ::(5,[])::(6,[])::[]
285      in
286       if List.flatten (List.map snd res) <> [] then res
287       else
288        (* all errors (if any) are not significant: we keep them *)
289        let res =
290         (1,[])::(2,[])
291         ::(3,(safe_list_nth errorll 2))
292         ::(4,(safe_list_nth errorll 3))
293         ::(5,[])::(6,[])::[]
294        in
295         if List.flatten (List.map snd res) <> [] then
296          begin
297           HLog.warn
298            "All disambiguation errors are not significant. Showing them anyway." ;
299           res
300          end
301         else
302          begin
303           HLog.warn
304            "No errors in phases 2 and 3. Showing all errors in all phases" ;
305           annotated_errorll ()
306          end
307    in
308   let choices = MatitaExcPp.compact_disambiguation_errors all_passes errorll' in
309    match choices with
310       [] -> assert false
311     | [loffset,[_,envs_and_diffs,msg,significant]] ->
312         let _,env,diff = List.hd envs_and_diffs in
313          notify_exn
314           (MultiPassDisambiguator.DisambiguationError
315             (offset,[[env,diff,lazy (loffset,Lazy.force msg),significant]]));
316     | _::_ ->
317        let dialog = new disambiguationErrors () in
318        if all_passes then
319         dialog#disambiguationErrorsMoreErrors#misc#set_sensitive false;
320        let model = new interpErrorModel dialog#treeview choices in
321        dialog#disambiguationErrors#set_title "Disambiguation error";
322        dialog#disambiguationErrorsLabel#set_label
323         "Click on an error to see the corresponding message:";
324        ignore (dialog#treeview#connect#cursor_changed
325         (fun _ ->
326           let tree_path =
327            match fst (dialog#treeview#get_cursor ()) with
328               None -> assert false
329            | Some tp -> tp in
330           let idx1,idx2,idx3 = model#get_interp_no tree_path in
331           let loffset,lll = List.nth choices idx1 in
332           let _,envs_and_diffs,msg,significant =
333            match idx2 with
334               Some idx2 -> List.nth lll idx2
335             | None ->
336                 [],[],lazy "Multiple error messages. Please select one.",true
337           in
338           let _,env,diff =
339            match idx3 with
340               Some idx3 -> List.nth envs_and_diffs idx3
341             | None -> [],[],[] (* dymmy value, used *) in
342           let script = MatitaScript.current () in
343           let error_tag = script#error_tag in
344            source_buffer#remove_tag error_tag
345              ~start:source_buffer#start_iter
346              ~stop:source_buffer#end_iter;
347            notify_exn
348             (MultiPassDisambiguator.DisambiguationError
349               (offset,[[env,diff,lazy(loffset,Lazy.force msg),significant]]))
350            ));
351        let return _ =
352          dialog#disambiguationErrors#destroy ();
353          GMain.Main.quit ()
354        in
355        let fail _ = return () in
356        ignore(dialog#disambiguationErrors#event#connect#delete (fun _ -> true));
357        connect_button dialog#disambiguationErrorsOkButton
358         (fun _ ->
359           let tree_path =
360            match fst (dialog#treeview#get_cursor ()) with
361               None -> assert false
362            | Some tp -> tp in
363           let idx1,idx2,idx3 = model#get_interp_no tree_path in
364           let diff =
365            match idx2,idx3 with
366               Some idx2, Some idx3 ->
367                let _,lll = List.nth choices idx1 in
368                let _,envs_and_diffs,_,_ = List.nth lll idx2 in
369                let _,_,diff = List.nth envs_and_diffs idx3 in
370                 diff
371             | _,_ -> assert false
372           in
373            let newtxt =
374             String.concat "\n"
375              ("" ::
376                List.map
377                 (fun k,desc -> 
378                   let alias =
379                    match k with
380                    | DisambiguateTypes.Id id ->
381                        (* XXX we don't have an uri to put into Ident_alias! 
382                         * then we use the description??
383                         * what does this code mean?? *)
384                        (* FIXME we are not using info from the domain_item to
385                         * fill in the alias_spec *)
386                        GrafiteAst.Ident_alias (id, desc)
387                    | DisambiguateTypes.Symbol symb-> 
388                        GrafiteAst.Symbol_alias (symb, None, desc)
389                    | DisambiguateTypes.Num ->
390                        GrafiteAst.Number_alias (None,desc)
391                   in
392                    GrafiteAstPp.pp_alias alias)
393                 diff) ^ "\n"
394            in
395             source_buffer#insert
396              ~iter:
397                (source_buffer#get_iter_at_mark
398                 (`NAME "beginning_of_statement")) newtxt ;
399             return ()
400         );
401        connect_button dialog#disambiguationErrorsMoreErrors
402         (fun _ -> return () ; raise UseLibrary);
403        connect_button dialog#disambiguationErrorsCancelButton fail;
404        dialog#disambiguationErrors#show ();
405        GtkThread.main ()
406
407
408 class gui () =
409     (* creation order _is_ relevant for windows placement *)
410   let main = new mainWin () in
411   let sequents_viewer =
412    MatitaMathView.sequentsViewer_instance main#sequentsNotebook in
413   let fileSel = new fileSelectionWin () in
414   let findRepl = new findReplWin () in
415   let keyBindingBoxes = (* event boxes which should receive global key events *)
416     [ main#mainWinEventBox ]
417   in
418   let console = new console ~buffer:main#logTextView#buffer () in
419   object (self)
420     val mutable chosen_file = None
421     val mutable _ok_not_exists = false
422     val mutable _only_directory = false
423       
424     initializer
425       let s () = MatitaScript.current () in
426         (* key bindings *)
427       List.iter (* global key bindings *)
428         (fun (key, modifiers, callback) -> 
429                 self#addKeyBinding key ~modifiers callback)
430 (*
431         [ GdkKeysyms._F3,
432             toggle_win ~check:main#showProofMenuItem proof#proofWin;
433           GdkKeysyms._F4,
434             toggle_win ~check:main#showCheckMenuItem check#checkWin;
435 *)
436         [ 
437           GdkKeysyms._Page_Down, [`CONTROL], main#scriptNotebook#next_page;
438           GdkKeysyms._Page_Up,   [`CONTROL], main#scriptNotebook#previous_page
439         ];
440         (* about win *)
441       let parse_txt_file file =
442        let ch = open_in (BuildTimeConf.runtime_base_dir ^ "/" ^ file) in
443        let l_rev = ref [] in
444        try
445         while true do
446          l_rev := input_line ch :: !l_rev;
447         done;
448         assert false
449        with
450         End_of_file ->
451          close_in ch;
452          List.rev !l_rev in 
453       let about_dialog =
454        GWindow.about_dialog
455         ~authors:(parse_txt_file "AUTHORS")
456         (*~comments:"comments"*)
457         ~copyright:"Copyright (C) 2005, the HELM team"
458         ~license:(String.concat "\n" (parse_txt_file "LICENSE"))
459         ~logo:(GdkPixbuf.from_file (MatitaMisc.image_path "/matita_medium.png"))
460         ~name:"Matita"
461         ~version:BuildTimeConf.version
462         ~website:"http://matita.cs.unibo.it"
463         ()
464       in
465       ignore(about_dialog#connect#response (fun _ ->about_dialog#misc#hide ()));
466       connect_menu_item main#contentsMenuItem (fun () ->
467         if 0 = Sys.command "which gnome-help" then
468           let cmd =
469             sprintf "gnome-help ghelp://%s/C/matita.xml &" BuildTimeConf.help_dir
470           in
471            ignore (Sys.command cmd)
472         else
473           MatitaGtkMisc.report_error ~title:"help system error"
474            ~message:(
475               "The program gnome-help is not installed\n\n"^
476               "To browse the user manal it is necessary to install "^
477               "the gnome help syste (also known as yelp)") 
478            ~parent:main#toplevel ());
479       connect_menu_item main#aboutMenuItem about_dialog#present;
480         (* findRepl win *)
481       let show_find_Repl () = 
482         findRepl#toplevel#misc#show ();
483         findRepl#toplevel#misc#grab_focus ()
484       in
485       let hide_find_Repl () = findRepl#toplevel#misc#hide () in
486       let find_forward _ = 
487           let source_view = (s ())#source_view in
488           let highlight start end_ =
489             source_view#source_buffer#move_mark `INSERT ~where:start;
490             source_view#source_buffer#move_mark `SEL_BOUND ~where:end_;
491             source_view#scroll_mark_onscreen `INSERT
492           in
493           let text = findRepl#findEntry#text in
494           let iter = source_view#source_buffer#get_iter `SEL_BOUND in
495           match iter#forward_search text with
496           | None -> 
497               (match source_view#source_buffer#start_iter#forward_search text with
498               | None -> ()
499               | Some (start,end_) -> highlight start end_)
500           | Some (start,end_) -> highlight start end_ 
501       in
502       let replace _ =
503         let source_view = (s ())#source_view in
504         let text = findRepl#replaceEntry#text in
505         let ins = source_view#source_buffer#get_iter `INSERT in
506         let sel = source_view#source_buffer#get_iter `SEL_BOUND in
507         if ins#compare sel < 0 then 
508           begin
509             ignore(source_view#source_buffer#delete_selection ());
510             source_view#source_buffer#insert text
511           end
512       in
513       connect_button findRepl#findButton find_forward;
514       connect_button findRepl#findReplButton replace;
515       connect_button findRepl#cancelButton (fun _ -> hide_find_Repl ());
516       ignore(findRepl#toplevel#event#connect#delete 
517         ~callback:(fun _ -> hide_find_Repl ();true));
518       connect_menu_item main#undoMenuItem
519        (fun () -> (MatitaScript.current ())#safe_undo);
520 (*CSC: XXX
521       ignore(source_view#source_buffer#connect#can_undo
522         ~callback:main#undoMenuItem#misc#set_sensitive);
523 *) main#undoMenuItem#misc#set_sensitive true;
524       connect_menu_item main#redoMenuItem
525        (fun () -> (MatitaScript.current ())#safe_redo);
526 (*CSC: XXX
527       ignore(source_view#source_buffer#connect#can_redo
528         ~callback:main#redoMenuItem#misc#set_sensitive);
529 *) main#redoMenuItem#misc#set_sensitive true;
530       connect_menu_item main#editMenu (fun () ->
531         main#copyMenuItem#misc#set_sensitive
532          (MatitaScript.current ())#canCopy;
533         main#cutMenuItem#misc#set_sensitive
534          (MatitaScript.current ())#canCut;
535         main#deleteMenuItem#misc#set_sensitive
536          (MatitaScript.current ())#canDelete;
537         main#pasteMenuItem#misc#set_sensitive
538          (MatitaScript.current ())#canPaste;
539         main#pastePatternMenuItem#misc#set_sensitive
540          (MatitaScript.current ())#canPastePattern);
541       connect_menu_item main#copyMenuItem
542          (fun () -> (MatitaScript.current ())#copy ());
543       connect_menu_item main#cutMenuItem
544          (fun () -> (MatitaScript.current ())#cut ());
545       connect_menu_item main#deleteMenuItem
546          (fun () -> (MatitaScript.current ())#delete ());
547       connect_menu_item main#pasteMenuItem
548          (fun () -> (MatitaScript.current ())#paste ());
549       connect_menu_item main#pastePatternMenuItem
550          (fun () -> (MatitaScript.current ())#pastePattern ());
551       connect_menu_item main#selectAllMenuItem (fun () ->
552        let source_view = (s ())#source_view in
553         source_view#source_buffer#move_mark `INSERT source_view#source_buffer#start_iter;
554         source_view#source_buffer#move_mark `SEL_BOUND source_view#source_buffer#end_iter);
555       connect_menu_item main#findReplMenuItem show_find_Repl;
556       connect_menu_item main#externalEditorMenuItem self#externalEditor;
557       connect_menu_item main#ligatureButton
558        (fun () -> (MatitaScript.current ())#nextSimilarSymbol);
559       ignore (findRepl#findEntry#connect#activate find_forward);
560         (* interface lockers *)
561       let lock_world _ =
562        let source_view = (s ())#source_view in
563         main#buttonsToolbar#misc#set_sensitive false;
564         main#scriptMenu#misc#set_sensitive false;
565         source_view#set_editable false
566       in
567       let unlock_world _ =
568        let source_view = (s ())#source_view in
569         main#buttonsToolbar#misc#set_sensitive true;
570         main#scriptMenu#misc#set_sensitive true;
571         source_view#set_editable true;
572         (*The next line seems sufficient to avoid some unknown race condition *)
573         GtkThread.sync (fun () -> ()) ()
574       in
575       let worker_thread = ref None in
576       let notify_exn (source_view : GSourceView2.source_view) exn =
577        let floc, msg = MatitaExcPp.to_string exn in
578         begin
579          match floc with
580             None -> ()
581           | Some floc ->
582              let (x, y) = HExtlib.loc_of_floc floc in
583              let script = MatitaScript.current () in
584              let locked_mark = script#locked_mark in
585              let error_tag = script#error_tag in
586              let baseoffset =
587               (source_view#source_buffer#get_iter_at_mark (`MARK locked_mark))#offset in
588              let x' = baseoffset + x in
589              let y' = baseoffset + y in
590              let x_iter = source_view#source_buffer#get_iter (`OFFSET x') in
591              let y_iter = source_view#source_buffer#get_iter (`OFFSET y') in
592              source_view#source_buffer#apply_tag error_tag ~start:x_iter ~stop:y_iter;
593              let id = ref None in
594              id := Some (source_view#source_buffer#connect#changed ~callback:(fun () ->
595                source_view#source_buffer#remove_tag error_tag
596                  ~start:source_view#source_buffer#start_iter
597                  ~stop:source_view#source_buffer#end_iter;
598                match !id with
599                | None -> assert false (* a race condition occurred *)
600                | Some id ->
601                    source_view#source_buffer#misc#disconnect id));
602              source_view#source_buffer#place_cursor
603               (source_view#source_buffer#get_iter (`OFFSET x'));
604         end;
605         HLog.error msg in
606       let locker f script =
607        let source_view = script#source_view in
608        let thread_main =
609         fun () -> 
610           lock_world ();
611           let saved_use_library= !MultiPassDisambiguator.use_library in
612           try
613            MultiPassDisambiguator.use_library := !all_disambiguation_passes;
614            f script;
615            MultiPassDisambiguator.use_library := saved_use_library;
616            unlock_world ()
617           with
618            | MultiPassDisambiguator.DisambiguationError (offset,errorll) ->
619               (try
620                 interactive_error_interp 
621                  ~all_passes:!all_disambiguation_passes source_view#source_buffer
622                  (notify_exn source_view) offset errorll (s())#filename
623                with
624                 | UseLibrary ->
625                    MultiPassDisambiguator.use_library := true;
626                    (try f script
627                     with
628                     | MultiPassDisambiguator.DisambiguationError (offset,errorll) ->
629                        interactive_error_interp ~all_passes:true source_view#source_buffer
630                         (notify_exn source_view) offset errorll (s())#filename
631                     | exc ->
632                        notify_exn source_view exc);
633                 | exc -> notify_exn source_view exc);
634               MultiPassDisambiguator.use_library := saved_use_library;
635               unlock_world ()
636            | exc ->
637               (try notify_exn source_view exc
638                with Sys.Break as e -> notify_exn source_view e);
639               unlock_world ()
640        in
641        (*thread_main ();*)
642        worker_thread := Some (Thread.create thread_main ())
643       in
644       let kill_worker =
645        (* the following lines are from Xavier Leroy: http://alan.petitepomme.net/cwn/2005.11.08.html *)
646        let interrupt = ref None in
647        let old_callback = ref (function _ -> ()) in
648        let force_interrupt n =
649          (* This function is called just before the thread's timeslice ends *)
650          !old_callback n;
651          if Some(Thread.id(Thread.self())) = !interrupt then
652           (interrupt := None; raise Sys.Break) in
653        let _ =
654         match Sys.signal Sys.sigvtalrm (Sys.Signal_handle force_interrupt) with
655            Sys.Signal_handle f -> old_callback := f
656          | Sys.Signal_ignore
657          | Sys.Signal_default -> assert false
658        in
659         fun () ->
660          match !worker_thread with
661             None -> assert false
662           | Some t -> interrupt := Some (Thread.id t) in
663       let keep_focus f (script: MatitaScript.script) =
664          try
665           f script; script#source_view#misc#grab_focus ()
666          with
667           exc -> script#source_view#misc#grab_focus (); raise exc in
668       
669         (* file selection win *)
670       ignore (fileSel#fileSelectionWin#event#connect#delete (fun _ -> true));
671       ignore (fileSel#fileSelectionWin#connect#response (fun event ->
672         let return r =
673           chosen_file <- r;
674           fileSel#fileSelectionWin#misc#hide ();
675           GMain.Main.quit ()
676         in
677         match event with
678         | `OK ->
679             let fname = fileSel#fileSelectionWin#filename in
680             if Sys.file_exists fname then
681               begin
682                 if HExtlib.is_regular fname && not (_only_directory) then 
683                   return (Some fname) 
684                 else if _only_directory && HExtlib.is_dir fname then 
685                   return (Some fname)
686               end
687             else
688               begin
689                 if _ok_not_exists then 
690                   return (Some fname)
691               end
692         | `CANCEL -> return None
693         | `HELP -> ()
694         | `DELETE_EVENT -> return None));
695         (* menus *)
696       List.iter (fun w -> w#misc#set_sensitive false) [ main#saveMenuItem ];
697         (* console *)
698       let adj = main#logScrolledWin#vadjustment in
699         ignore (adj#connect#changed
700                 (fun _ -> adj#set_value (adj#upper -. adj#page_size)));
701       console#message (sprintf "\tMatita version %s\n" BuildTimeConf.version);
702         (* natural deduction palette *)
703       main#tacticsButtonsHandlebox#misc#hide ();
704       MatitaGtkMisc.toggle_callback
705         ~callback:(fun b -> 
706           if b then main#tacticsButtonsHandlebox#misc#show ()
707           else main#tacticsButtonsHandlebox#misc#hide ())
708         ~check:main#menuitemPalette;
709       connect_button main#butImpl_intro
710         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (⇒#i […] (…));\n");
711       connect_button main#butAnd_intro
712         (fun () -> (s ())#source_view#source_buffer#insert 
713           "apply rule (∧#i (…) (…));\n\t[\n\t|\n\t]\n");
714       connect_button main#butOr_intro_left
715         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (∨#i_l (…));\n");
716       connect_button main#butOr_intro_right
717         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (∨#i_r (…));\n");
718       connect_button main#butNot_intro
719         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (¬#i […] (…));\n");
720       connect_button main#butTop_intro
721         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (⊤#i);\n");
722       connect_button main#butImpl_elim
723         (fun () -> (s ())#source_view#source_buffer#insert 
724           "apply rule (⇒#e (…) (…));\n\t[\n\t|\n\t]\n");
725       connect_button main#butAnd_elim_left
726         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (∧#e_l (…));\n");
727       connect_button main#butAnd_elim_right
728         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (∧#e_r (…));\n");
729       connect_button main#butOr_elim
730         (fun () -> (s ())#source_view#source_buffer#insert 
731           "apply rule (∨#e (…) […] (…) […] (…));\n\t[\n\t|\n\t|\n\t]\n");
732       connect_button main#butNot_elim
733         (fun () -> (s ())#source_view#source_buffer#insert 
734           "apply rule (¬#e (…) (…));\n\t[\n\t|\n\t]\n");
735       connect_button main#butBot_elim
736         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (⊥#e (…));\n");
737       connect_button main#butRAA
738         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (RAA […] (…));\n");
739       connect_button main#butUseLemma
740         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (lem #premises name â€¦);\n");
741       connect_button main#butDischarge
742         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (discharge […]);\n");
743       
744       connect_button main#butForall_intro
745         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (∀#i {…} (…));\n");
746       connect_button main#butForall_elim
747         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (∀#e {…} (…));\n");
748       connect_button main#butExists_intro
749         (fun () -> (s ())#source_view#source_buffer#insert "apply rule (∃#i {…} (…));\n");
750       connect_button main#butExists_elim
751         (fun () -> (s ())#source_view#source_buffer#insert 
752           "apply rule (∃#e (…) {…} […] (…));\n\t[\n\t|\n\t]\n");
753
754     
755       let module Hr = Helm_registry in
756       MatitaGtkMisc.toggle_callback ~check:main#fullscreenMenuItem
757         ~callback:(function 
758           | true -> main#toplevel#fullscreen () 
759           | false -> main#toplevel#unfullscreen ());
760       main#fullscreenMenuItem#set_active false;
761       MatitaGtkMisc.toggle_callback ~check:main#ppNotationMenuItem
762         ~callback:(function b ->
763           let s = s () in
764           let _status = Interpretations.toggle_active_interpretations s#status b
765           in
766            assert false (* MATITA 1.0 ???
767            s#set_grafite_status status*)
768          );
769       MatitaGtkMisc.toggle_callback ~check:main#hideCoercionsMenuItem
770         ~callback:(fun enabled -> Interpretations.hide_coercions := enabled);
771       MatitaGtkMisc.toggle_callback ~check:main#unicodeAsTexMenuItem
772         ~callback:(fun enabled ->
773           Helm_registry.set_bool "matita.paste_unicode_as_tex" enabled);
774       main#unicodeAsTexMenuItem#set_active
775         (Helm_registry.get_bool "matita.paste_unicode_as_tex");
776         (* log *)
777       HLog.set_log_callback self#console#log_callback;
778       GtkSignal.user_handler :=
779         (function 
780         | MatitaScript.ActionCancelled s -> HLog.error s
781         | exn ->
782           if not (Helm_registry.get_bool "matita.debug") then
783            (* MatitaScript.current is problably wrong, but what else
784               can we do? *)
785            notify_exn (MatitaScript.current ())#source_view exn
786           else raise exn);
787       let loadScript () =
788         try 
789           match self#chooseFile () with
790           | Some f -> self#loadScript f
791           | None -> ()
792         with MatitaTypes.Cancel -> ()
793       in
794       let cursor () =
795        let source_view = (s ())#source_view in
796         source_view#source_buffer#place_cursor
797           (source_view#source_buffer#get_iter_at_mark (`NAME "locked")) in
798       let advance (script: MatitaScript.script) = script#advance (); cursor () in
799       let retract (script: MatitaScript.script) = script#retract (); cursor () in
800       let top (script: MatitaScript.script) = script#goto `Top (); cursor () in
801       let bottom (script: MatitaScript.script) = script#goto `Bottom (); cursor () in
802       let jump (script: MatitaScript.script) = script#goto `Cursor (); cursor () in
803       let advance () = locker (keep_focus advance) (MatitaScript.current ()) in
804       let retract () = locker (keep_focus retract) (MatitaScript.current ()) in
805       let top () = locker (keep_focus top) (MatitaScript.current ()) in
806       let bottom () = locker (keep_focus bottom) (MatitaScript.current ()) in
807       let jump () = locker (keep_focus jump) (MatitaScript.current ()) in
808         (* quit *)
809       self#setQuitCallback (fun () -> 
810        let cancel = ref false in
811         MatitaScript.iter_scripts
812          (fun script ->
813            if not !cancel then
814             if not (self#closeScript0 script) then
815              cancel := true);
816         if not !cancel then
817          GMain.Main.quit ());
818       connect_button main#scriptAdvanceButton advance;
819       connect_button main#scriptRetractButton retract;
820       connect_button main#scriptTopButton top;
821       connect_button main#scriptBottomButton bottom;
822       connect_button main#scriptJumpButton jump;
823       connect_button main#scriptAbortButton kill_worker;
824       connect_menu_item main#scriptAdvanceMenuItem advance;
825       connect_menu_item main#scriptRetractMenuItem retract;
826       connect_menu_item main#scriptTopMenuItem top;
827       connect_menu_item main#scriptBottomMenuItem bottom;
828       connect_menu_item main#scriptJumpMenuItem jump;
829       connect_menu_item main#openMenuItem   loadScript;
830       connect_menu_item main#saveMenuItem 
831        (fun () -> self#saveScript (MatitaScript.current ()));
832       connect_menu_item main#saveAsMenuItem
833        (fun () -> self#saveAsScript (MatitaScript.current ()));
834       connect_menu_item main#newMenuItem self#newScript;
835       connect_menu_item main#closeMenuItem self#closeCurrentScript;
836       connect_menu_item main#showCoercionsGraphMenuItem 
837         (fun _ -> MatitaMathView.cicBrowser (Some (`About `Coercions)));
838       connect_menu_item main#showHintsDbMenuItem 
839         (fun _ -> MatitaMathView.cicBrowser (Some (`About `Hints)));
840       connect_menu_item main#showTermGrammarMenuItem 
841         (fun _ -> MatitaMathView.cicBrowser (Some (`About `Grammar)));
842       connect_menu_item main#showUnicodeTable
843         (fun _ -> MatitaMathView.cicBrowser (Some (`About `TeX)));
844         (* debug menu *)
845       main#debugMenu#misc#hide ();
846         (* HBUGS *)
847       main#hintNotebook#misc#hide ();
848       (*
849       main#hintLowImage#set_file (image_path "matita-bulb-low.png");
850       main#hintMediumImage#set_file (image_path "matita-bulb-medium.png");
851       main#hintHighImage#set_file (image_path "matita-bulb-high.png");
852       *)
853         (* main win dimension *)
854       let width = Gdk.Screen.width ~screen:(Gdk.Screen.default ()) () in
855       let height = Gdk.Screen.height ~screen:(Gdk.Screen.default ()) () in
856       (* hack for xinerama, no proper support of monitors from lablgtk *)
857       let width = if width > 1600 then width / 2 else width in
858       let height = if height > 1200 then height / 2 else height in
859       let main_w = width * 90 / 100 in 
860       let main_h = height * 80 / 100 in
861       let script_w = main_w * 6 / 10 in
862       main#toplevel#resize ~width:main_w ~height:main_h;
863       main#hpaneScriptSequent#set_position script_w;
864       (* math view handling *)
865       connect_menu_item main#newCicBrowserMenuItem (fun () ->
866         ignore(MatitaMathView.cicBrowser None));
867       connect_menu_item main#increaseFontSizeMenuItem
868         MatitaMisc.increase_font_size;
869       connect_menu_item main#decreaseFontSizeMenuItem
870         MatitaMisc.decrease_font_size;
871       connect_menu_item main#normalFontSizeMenuItem
872         MatitaMisc.reset_font_size;
873       ignore (main#scriptNotebook#connect#switch_page
874        (fun page ->
875          let script = MatitaScript.at_page page in
876           script#activate;
877           main#saveMenuItem#misc#set_sensitive script#has_name))
878
879     method private externalEditor () =
880      let script = MatitaScript.current () in
881      let source_view = script#source_view in
882       let cmd = Helm_registry.get "matita.external_editor" in
883 (* ZACK uncomment to enable interactive ask of external editor command *)
884 (*      let cmd =
885          let msg =
886           "External editor command:
887 %f  will be substitute for the script name,
888 %p  for the cursor position in bytes,
889 %l  for the execution point in bytes."
890         in
891         ask_text ~gui:self ~title:"External editor" ~msg ~multiline:false
892           ~default:(Helm_registry.get "matita.external_editor") ()
893       in *)
894       let fname = script#filename in
895       let slice mark =
896         source_view#source_buffer#start_iter#get_slice
897           ~stop:(source_view#source_buffer#get_iter_at_mark mark)
898       in
899       let locked = `MARK script#locked_mark in
900       let string_pos mark = string_of_int (String.length (slice mark)) in
901       let cursor_pos = string_pos `INSERT in
902       let locked_pos = string_pos locked in
903       let cmd =
904         Pcre.replace ~pat:"%f" ~templ:fname
905           (Pcre.replace ~pat:"%p" ~templ:cursor_pos
906             (Pcre.replace ~pat:"%l" ~templ:locked_pos
907               cmd))
908       in
909       let locked_before = slice locked in
910       let locked_offset = (source_view#source_buffer#get_iter_at_mark locked)#offset in
911       ignore (Unix.system cmd);
912       source_view#source_buffer#set_text (HExtlib.input_file fname);
913       let locked_iter = source_view#source_buffer#get_iter (`OFFSET locked_offset) in
914       source_view#source_buffer#move_mark locked locked_iter;
915       source_view#source_buffer#apply_tag script#locked_tag
916         ~start:source_view#source_buffer#start_iter ~stop:locked_iter;
917       let locked_after = slice locked in
918       let line = ref 0 in
919       let col = ref 0 in
920       try
921         for i = 0 to String.length locked_before - 1 do
922           if locked_before.[i] <> locked_after.[i] then begin
923             source_view#source_buffer#place_cursor
924               ~where:(source_view#source_buffer#get_iter (`LINEBYTE (!line, !col)));
925             script#goto `Cursor ();
926             raise Exit
927           end else if locked_before.[i] = '\n' then begin
928             incr line;
929             col := 0
930           end
931         done
932       with
933       | Exit -> ()
934       | Invalid_argument _ -> script#goto `Bottom ()
935
936     method private saveAsScript script = 
937      match self#chooseFile ~ok_not_exists:true () with
938      | Some f -> 
939            HExtlib.touch f;
940            script#assignFileName (Some f);
941            script#saveToFile (); 
942            console#message ("'"^f^"' saved.\n");
943            self#_enableSaveTo f
944      | None -> ()
945
946     method private saveScript script = 
947      if script#has_name then 
948        (script#saveToFile (); 
949         console#message ("'"^script#filename^"' saved.\n"))
950      else self#saveAsScript script
951     
952     (* returns false if closure is aborted by the user *)
953     method private closeScript0 script = 
954       if script#source_view#buffer#modified then
955         match
956          ask_unsaved main#toplevel (Filename.basename script#filename)
957         with
958         | `YES -> 
959              self#saveScript script;
960              save_moo script#status;
961              true
962         | `NO -> true
963         | `CANCEL -> false
964       else 
965        (save_moo script#status; true)
966
967     method private closeScript page script = 
968      if self#closeScript0 script then
969       begin
970        MatitaScript.destroy page;
971        ignore (main#scriptNotebook#remove_page page)
972       end
973
974     method private closeCurrentScript () = 
975      let page = main#scriptNotebook#current_page in
976      let script = MatitaScript.at_page page in 
977       self#closeScript page script
978
979     method newScript () = 
980        let scrolledWindow = GBin.scrolled_window () in
981        let hbox = GPack.hbox () in
982        let tab_label = GMisc.label ~text:"foo" ~packing:hbox#pack () in
983        let _ =
984         GMisc.label ~text:"" ~packing:(hbox#pack ~expand:true ~fill:true) () in
985        let closebutton =
986         GButton.button ~relief:`NONE ~packing:hbox#pack () in
987        let image = GMisc.image ~stock:`CLOSE ~icon_size:`MENU () in
988        closebutton#set_image image#coerce;
989        let script = MatitaScript.script ~parent:scrolledWindow ~tab_label () in
990         ignore (main#scriptNotebook#prepend_page ~tab_label:hbox#coerce
991          scrolledWindow#coerce);
992         ignore (closebutton#connect#clicked (fun () ->
993          self#closeScript
994           (main#scriptNotebook#page_num scrolledWindow#coerce) script));
995         main#scriptNotebook#goto_page 0;
996         sequents_viewer#reset;
997         sequents_viewer#load_logo;
998         let browser_observer _ = MatitaMathView.refresh_all_browsers () in
999         let sequents_observer status =
1000           sequents_viewer#reset;
1001           match status#ng_mode with
1002              `ProofMode ->
1003               sequents_viewer#nload_sequents status;
1004               (try
1005                 let goal =
1006                  Continuationals.Stack.find_goal status#stack
1007                 in
1008                  sequents_viewer#goto_sequent status goal
1009               with Failure _ -> ());
1010            | `CommandMode -> sequents_viewer#load_logo
1011         in
1012         script#addObserver sequents_observer;
1013         script#addObserver browser_observer
1014
1015     method loadScript file =       
1016      let page = main#scriptNotebook#current_page in
1017      let script = MatitaScript.at_page page in
1018       if script#source_view#buffer#modified || script#has_name then
1019        self#newScript ();
1020      let script = MatitaScript.current () in
1021      let source_view = script#source_view in
1022       script#reset (); 
1023       script#assignFileName (Some file);
1024       let file = script#filename in
1025       let content =
1026        if Sys.file_exists file then file
1027        else BuildTimeConf.script_template
1028       in
1029       source_view#source_buffer#begin_not_undoable_action ();
1030       script#loadFromFile content;
1031       source_view#source_buffer#end_not_undoable_action ();
1032       source_view#buffer#move_mark `INSERT source_view#buffer#start_iter;
1033       source_view#buffer#place_cursor source_view#buffer#start_iter;
1034       console#message ("'"^file^"' loaded.");
1035       self#_enableSaveTo file
1036
1037     method private _enableSaveTo file =
1038       self#main#saveMenuItem#misc#set_sensitive true
1039         
1040     method private console = console
1041     method private fileSel = fileSel
1042     method private findRepl = findRepl
1043     method main = main
1044
1045     method private addKeyBinding key ?modifiers callback =
1046 (*       List.iter (fun evbox -> add_key_binding key callback evbox) *)
1047       List.iter (fun evbox -> connect_key evbox#event key ?modifiers callback)
1048         keyBindingBoxes
1049
1050     method private setQuitCallback callback =
1051       connect_menu_item main#quitMenuItem callback;
1052       ignore (main#toplevel#event#connect#delete 
1053         (fun _ -> callback ();true));
1054       self#addKeyBinding GdkKeysyms._q callback
1055
1056     method private chooseFile ?(ok_not_exists = false) () =
1057       _ok_not_exists <- ok_not_exists;
1058       _only_directory <- false;
1059       fileSel#fileSelectionWin#show ();
1060       GtkThread.main ();
1061       chosen_file
1062
1063     method private chooseDir ?(ok_not_exists = false) () =
1064       _ok_not_exists <- ok_not_exists;
1065       _only_directory <- true;
1066       fileSel#fileSelectionWin#show ();
1067       GtkThread.main ();
1068       (* we should check that this is a directory *)
1069       chosen_file
1070   
1071   end
1072
1073 let gui () = 
1074   let g = new gui () in
1075   let rg = (g :> MatitaGuiTypes.gui) in
1076   MatitaMisc.set_gui rg;
1077   g#newScript ();
1078   rg
1079   
1080 let instance = singleton gui
1081
1082 let non p x = not (p x)
1083
1084 class interpModel =
1085   let cols = new GTree.column_list in
1086   let id_col = cols#add Gobject.Data.string in
1087   let dsc_col = cols#add Gobject.Data.string in
1088   let interp_no_col = cols#add Gobject.Data.int in
1089   let tree_store = GTree.tree_store cols in
1090   let id_renderer = GTree.cell_renderer_text [], ["text", id_col] in
1091   let dsc_renderer = GTree.cell_renderer_text [], ["text", dsc_col] in
1092   let id_view_col = GTree.view_column ~renderer:id_renderer () in
1093   let dsc_view_col = GTree.view_column ~renderer:dsc_renderer () in
1094   fun tree_view choices ->
1095     object
1096       initializer
1097         tree_view#set_model (Some (tree_store :> GTree.model));
1098         ignore (tree_view#append_column id_view_col);
1099         ignore (tree_view#append_column dsc_view_col);
1100         let name_of_interp =
1101           (* try to find a reasonable name for an interpretation *)
1102           let idx = ref 0 in
1103           fun interp ->
1104             try
1105               List.assoc "0" interp
1106             with Not_found ->
1107               incr idx; string_of_int !idx
1108         in
1109         tree_store#clear ();
1110         let idx = ref ~-1 in
1111         List.iter
1112           (fun interp ->
1113             incr idx;
1114             let interp_row = tree_store#append () in
1115             tree_store#set ~row:interp_row ~column:id_col
1116               (name_of_interp interp);
1117             tree_store#set ~row:interp_row ~column:interp_no_col !idx;
1118             List.iter
1119               (fun (id, dsc) ->
1120                 let row = tree_store#append ~parent:interp_row () in
1121                 tree_store#set ~row ~column:id_col id;
1122                 tree_store#set ~row ~column:dsc_col dsc;
1123                 tree_store#set ~row ~column:interp_no_col !idx)
1124               interp)
1125           choices
1126
1127       method get_interp_no tree_path =
1128         let iter = tree_store#get_iter tree_path in
1129         tree_store#get ~row:iter ~column:interp_no_col
1130     end
1131
1132
1133 let interactive_string_choice 
1134   text prefix_len ?(title = "") ?(msg = "") () ~id locs uris 
1135
1136  let dialog = new uriChoiceDialog () in
1137  dialog#uriEntryHBox#misc#hide ();
1138  dialog#uriChoiceSelectedButton#misc#hide ();
1139  dialog#uriChoiceAutoButton#misc#hide ();
1140  dialog#uriChoiceConstantsButton#misc#hide ();
1141  dialog#uriChoiceTreeView#selection#set_mode
1142    (`SINGLE :> Gtk.Tags.selection_mode);
1143  let model = new stringListModel dialog#uriChoiceTreeView in
1144  let choices = ref None in
1145  dialog#uriChoiceDialog#set_title title; 
1146  let hack_len = MatitaGtkMisc.utf8_string_length text in
1147  let rec colorize acc_len = function
1148    | [] -> 
1149        let floc = HExtlib.floc_of_loc (acc_len,hack_len) in
1150        escape_pango_markup (fst(MatitaGtkMisc.utf8_parsed_text text floc))
1151    | he::tl -> 
1152        let start, stop =  HExtlib.loc_of_floc he in
1153        let floc1 = HExtlib.floc_of_loc (acc_len,start) in
1154        let str1,_=MatitaGtkMisc.utf8_parsed_text text floc1 in
1155        let str2,_ = MatitaGtkMisc.utf8_parsed_text text he in
1156        escape_pango_markup str1 ^ "<b>" ^ 
1157        escape_pango_markup str2 ^ "</b>" ^ 
1158        colorize stop tl
1159  in
1160 (*     List.iter (fun l -> let start, stop = HExtlib.loc_of_floc l in
1161               Printf.eprintf "(%d,%d)" start stop) locs; *)
1162   let locs = 
1163     List.sort 
1164       (fun loc1 loc2 -> 
1165         fst (HExtlib.loc_of_floc loc1) - fst (HExtlib.loc_of_floc loc2)) 
1166       locs 
1167   in
1168 (*     prerr_endline "XXXXXXXXXXXXXXXXXXXX";
1169   List.iter (fun l -> let start, stop = HExtlib.loc_of_floc l in
1170               Printf.eprintf "(%d,%d)" start stop) locs;
1171   prerr_endline "XXXXXXXXXXXXXXXXXXXX2"; *)
1172   dialog#uriChoiceLabel#set_use_markup true;
1173   let txt = colorize 0 locs in
1174   let txt,_ = MatitaGtkMisc.utf8_parsed_text txt
1175     (HExtlib.floc_of_loc (prefix_len,MatitaGtkMisc.utf8_string_length txt))
1176   in
1177   dialog#uriChoiceLabel#set_label txt;
1178   List.iter model#easy_append uris;
1179   let return v =
1180     choices := v;
1181     dialog#uriChoiceDialog#destroy ();
1182     GMain.Main.quit ()
1183   in
1184   ignore (dialog#uriChoiceDialog#event#connect#delete (fun _ -> true));
1185   connect_button dialog#uriChoiceForwardButton (fun _ ->
1186     match model#easy_selection () with
1187     | [] -> ()
1188     | uris -> return (Some uris));
1189   connect_button dialog#uriChoiceAbortButton (fun _ -> return None);
1190   dialog#uriChoiceDialog#show ();
1191   GtkThread.main ();
1192   (match !choices with 
1193   | None -> raise MatitaTypes.Cancel
1194   | Some uris -> uris)
1195
1196 let interactive_interp_choice () text prefix_len choices =
1197 (*List.iter (fun l -> prerr_endline "==="; List.iter (fun (_,id,dsc) -> prerr_endline (id ^ " = " ^ dsc)) l) choices;*)
1198  let filter_choices filter =
1199   let rec is_compatible filter =
1200    function
1201       [] -> true
1202     | ([],_,_)::tl -> is_compatible filter tl
1203     | (loc::tlloc,id,dsc)::tl ->
1204        try
1205         if List.assoc (loc,id) filter = dsc then
1206          is_compatible filter ((tlloc,id,dsc)::tl)
1207         else
1208          false
1209        with
1210         Not_found -> true
1211   in
1212    List.filter (fun (_,interp) -> is_compatible filter interp)
1213  in
1214  let rec get_choices loc id =
1215   function
1216      [] -> []
1217    | (_,he)::tl ->
1218       let _,_,dsc =
1219        List.find (fun (locs,id',_) -> id = id' && List.mem loc locs) he
1220       in
1221        dsc :: (List.filter (fun dsc' -> dsc <> dsc') (get_choices loc id tl))
1222  in
1223  let example_interp =
1224   match choices with
1225      [] -> assert false
1226    | he::_ -> he in
1227  let ask_user id locs choices =
1228   interactive_string_choice
1229    text prefix_len
1230    ~title:"Ambiguous input"
1231    ~msg:("Choose an interpretation for " ^ id) () ~id locs choices
1232  in
1233  let rec classify ids filter partial_interpretations =
1234   match ids with
1235      [] -> List.map fst partial_interpretations
1236    | ([],_,_)::tl -> classify tl filter partial_interpretations
1237    | (loc::tlloc,id,dsc)::tl ->
1238       let choices = get_choices loc id partial_interpretations in
1239       let chosen_dsc =
1240        match choices with
1241           [] -> prerr_endline ("NO CHOICES FOR " ^ id); assert false
1242         | [dsc] -> dsc
1243         | _ ->
1244           match ask_user id [loc] choices with
1245              [x] -> x
1246            | _ -> assert false
1247       in
1248        let filter = ((loc,id),chosen_dsc)::filter in
1249        let compatible_interps = filter_choices filter partial_interpretations in
1250         classify ((tlloc,id,dsc)::tl) filter compatible_interps
1251  in
1252  let enumerated_choices =
1253   let idx = ref ~-1 in
1254   List.map (fun interp -> incr idx; !idx,interp) choices
1255  in
1256   classify example_interp [] enumerated_choices
1257
1258 let interactive_ast_choice () ts =
1259   let choice =
1260     interactive_string_choice
1261      "" 0 ~title:"Ambiguous input"
1262      ~msg:("Choose an interpretation") () ~id:"" [] ts
1263   in
1264   let choice = match choice with
1265   | [c] -> c
1266   | _ -> assert false
1267   in
1268   let rec posn x = function
1269   | [] -> assert false
1270   | he::tl -> if he = x then 0 else 1 + posn x tl
1271   in
1272   posn choice ts
1273
1274 let _ =
1275   (* disambiguator callbacks *)
1276   (* Disambiguate.set_choose_uris_callback
1277    (fun ~selection_mode ?ok ?(enable_button_for_non_vars=false) ~title ~msg ->
1278      interactive_uri_choice ~selection_mode ?ok_label:ok ~title ~msg ());
1279   Disambiguate.set_choose_interp_callback (interactive_interp_choice ());
1280   Disambiguate.set_choose_disamb_callback (interactive_ast_choice ());*)
1281   (* gtk initialization *)
1282   GtkMain.Rc.add_default_file BuildTimeConf.gtkrc_file; (* loads gtk rc *)
1283   ignore (GMain.Main.init ())
1284