37
38:- module(prolog_xref,
39 [ xref_source/1, 40 xref_source/2, 41 xref_called/3, 42 xref_called/4, 43 xref_called/5, 44 xref_defined/3, 45 xref_definition_line/2, 46 xref_exported/2, 47 xref_module/2, 48 xref_uses_file/3, 49 xref_op/2, 50 xref_prolog_flag/4, 51 xref_comment/3, 52 xref_comment/4, 53 xref_mode/3, 54 xref_option/2, 55 xref_clean/1, 56 xref_current_source/1, 57 xref_done/2, 58 xref_built_in/1, 59 xref_source_file/3, 60 xref_source_file/4, 61 xref_public_list/3, 62 xref_public_list/4, 63 xref_public_list/6, 64 xref_public_list/7, 65 xref_meta/3, 66 xref_meta/2, 67 xref_hook/1, 68 69 xref_used_class/2, 70 xref_defined_class/3 71 ]). 72:- autoload(library(apply),[maplist/2,partition/4,maplist/3]). 73:- use_module(library(debug),[debug/3]). 74:- autoload(library(dialect),[expects_dialect/1]). 75:- autoload(library(error),[must_be/2,instantiation_error/1]). 76:- autoload(library(lists),[member/2,append/2,append/3,select/3]). 77:- autoload(library(operators),[push_op/3]). 78:- autoload(library(option),[option/2,option/3]). 79:- autoload(library(ordsets),[ord_intersect/2,ord_intersection/3]). 80:- autoload(library(prolog_code), [pi_head/2]). 81:- autoload(library(prolog_source),
82 [ prolog_canonical_source/2,
83 prolog_open_source/2,
84 prolog_close_source/1,
85 prolog_read_source_term/4,
86 prolog_file_directives/3
87 ]). 88
89:- if(exists_source(library(shlib))). 90:- autoload(library(shlib),[current_foreign_library/2]). 91:- endif. 92:- autoload(library(solution_sequences),[distinct/2,limit/2]). 93
94:- if(exists_source(library(pldoc))). 95:- use_module(library(pldoc), []). 96:- use_module(library(pldoc/doc_process)). 97
98:- endif. 99
100:- predicate_options(xref_source/2, 2,
101 [ silent(boolean),
102 module(atom),
103 register_called(oneof([all,non_iso,non_built_in])),
104 comments(oneof([store,collect,ignore])),
105 process_include(boolean),
106 stream(stream)
107 ]). 108
109
110:- dynamic
111 called/5, 112 (dynamic)/3, 113 (thread_local)/3, 114 (multifile)/3, 115 (public)/3, 116 (declared)/4, 117 defined/3, 118 meta_goal/3, 119 foreign/3, 120 constraint/3, 121 imported/3, 122 exported/2, 123 xmodule/2, 124 uses_file/3, 125 xop/2, 126 source/2, 127 used_class/2, 128 defined_class/5, 129 (mode)/2, 130 xoption/2, 131 xflag/4, 132 grammar_rule/2, 133 module_comment/3, 134 pred_comment/4, 135 pred_comment_link/3, 136 pred_mode/3. 137
138:- create_prolog_flag(xref, false, [type(boolean)]). 139
174
175:- predicate_options(xref_source_file/4, 4,
176 [ file_type(oneof([txt,prolog,directory])),
177 silent(boolean)
178 ]). 179:- predicate_options(xref_public_list/3, 3,
180 [ path(-atom),
181 module(-atom),
182 exports(-list(any)),
183 public(-list(any)),
184 meta(-list(any)),
185 silent(boolean)
186 ]). 187
188
189 192
199
207
212
217
218:- multifile
219 prolog:called_by/4, 220 prolog:called_by/2, 221 prolog:meta_goal/2, 222 prolog:hook/1, 223 prolog:generated_predicate/1, 224 prolog:no_autoload_module/1, 225 prolog:xref_source_time/2. 226
227:- meta_predicate
228 prolog:generated_predicate(:). 229
230:- dynamic
231 meta_goal/2. 232
233:- meta_predicate
234 process_predicates(2, +, +). 235
236 239
245
246hide_called(Callable, Src) :-
247 xoption(Src, register_called(Which)),
248 !,
249 mode_hide_called(Which, Callable).
250hide_called(Callable, _) :-
251 mode_hide_called(non_built_in, Callable).
252
253mode_hide_called(all, _) :- !, fail.
254mode_hide_called(non_iso, _:Goal) :-
255 goal_name_arity(Goal, Name, Arity),
256 current_predicate(system:Name/Arity),
257 predicate_property(system:Goal, iso).
258mode_hide_called(non_built_in, _:Goal) :-
259 goal_name_arity(Goal, Name, Arity),
260 current_predicate(system:Name/Arity),
261 predicate_property(system:Goal, built_in).
262mode_hide_called(non_built_in, M:Goal) :-
263 goal_name_arity(Goal, Name, Arity),
264 current_predicate(M:Name/Arity),
265 predicate_property(M:Goal, built_in).
266
270
271system_predicate(Goal) :-
272 goal_name_arity(Goal, Name, Arity),
273 current_predicate(system:Name/Arity), 274 predicate_property(system:Goal, built_in),
275 !.
276
277
278 281
282verbose(Src) :-
283 \+ xoption(Src, silent(true)).
284
285:- thread_local
286 xref_input/2. 287
288
315
316xref_source(Source) :-
317 xref_source(Source, []).
318
319xref_source(Source, Options) :-
320 prolog_canonical_source(Source, Src),
321 ( last_modified(Source, Modified)
322 -> ( source(Src, Modified)
323 -> true
324 ; xref_clean(Src),
325 assert(source(Src, Modified)),
326 do_xref(Src, Options)
327 )
328 ; xref_clean(Src),
329 get_time(Now),
330 assert(source(Src, Now)),
331 do_xref(Src, Options)
332 ).
333
334do_xref(Src, Options) :-
335 must_be(list, Options),
336 setup_call_cleanup(
337 xref_setup(Src, In, Options, State),
338 collect(Src, Src, In, Options),
339 xref_cleanup(State)).
340
341last_modified(Source, Modified) :-
342 prolog:xref_source_time(Source, Modified),
343 !.
344last_modified(Source, Modified) :-
345 atom(Source),
346 \+ is_global_url(Source),
347 exists_file(Source),
348 time_file(Source, Modified).
349
350is_global_url(File) :-
351 sub_atom(File, B, _, _, '://'),
352 !,
353 B > 1,
354 sub_atom(File, 0, B, _, Scheme),
355 atom_codes(Scheme, Codes),
356 maplist(between(0'a, 0'z), Codes).
357
358xref_setup(Src, In, Options, state(CleanIn, Dialect, Xref, [SRef|HRefs])) :-
359 maplist(assert_option(Src), Options),
360 assert_default_options(Src),
361 current_prolog_flag(emulated_dialect, Dialect),
362 ( option(stream(Stream), Options)
363 -> In = Stream,
364 CleanIn = true
365 ; prolog_open_source(Src, In),
366 CleanIn = prolog_close_source(In)
367 ),
368 set_initial_mode(In, Options),
369 asserta(xref_input(Src, In), SRef),
370 set_xref(Xref),
371 ( verbose(Src)
372 -> HRefs = []
373 ; asserta((user:thread_message_hook(_,Level,_) :-
374 hide_message(Level)),
375 Ref),
376 HRefs = [Ref]
377 ).
378
379hide_message(warning).
380hide_message(error).
381hide_message(informational).
382
383assert_option(_, Var) :-
384 var(Var),
385 !,
386 instantiation_error(Var).
387assert_option(Src, silent(Boolean)) :-
388 !,
389 must_be(boolean, Boolean),
390 assert(xoption(Src, silent(Boolean))).
391assert_option(Src, register_called(Which)) :-
392 !,
393 must_be(oneof([all,non_iso,non_built_in]), Which),
394 assert(xoption(Src, register_called(Which))).
395assert_option(Src, comments(CommentHandling)) :-
396 !,
397 must_be(oneof([store,collect,ignore]), CommentHandling),
398 assert(xoption(Src, comments(CommentHandling))).
399assert_option(Src, module(Module)) :-
400 !,
401 must_be(atom, Module),
402 assert(xoption(Src, module(Module))).
403assert_option(Src, process_include(Boolean)) :-
404 !,
405 must_be(boolean, Boolean),
406 assert(xoption(Src, process_include(Boolean))).
407assert_option(_, _).
408
409assert_default_options(Src) :-
410 ( xref_option_default(Opt),
411 generalise_term(Opt, Gen),
412 ( xoption(Src, Gen)
413 -> true
414 ; assertz(xoption(Src, Opt))
415 ),
416 fail
417 ; true
418 ).
419
420xref_option_default(silent(false)).
421xref_option_default(register_called(non_built_in)).
422xref_option_default(comments(collect)).
423xref_option_default(process_include(true)).
424
428
429xref_cleanup(state(CleanIn, Dialect, Xref, Refs)) :-
430 call(CleanIn),
431 set_prolog_flag(emulated_dialect, Dialect),
432 set_prolog_flag(xref, Xref),
433 maplist(erase, Refs).
434
435set_xref(Xref) :-
436 current_prolog_flag(xref, Xref),
437 set_prolog_flag(xref, true).
438
439:- meta_predicate
440 with_xref(0). 441
442with_xref(Goal) :-
443 current_prolog_flag(xref, Xref),
444 ( Xref == true
445 -> call(Goal)
446 ; setup_call_cleanup(
447 set_prolog_flag(xref, true),
448 Goal,
449 set_prolog_flag(xref, Xref))
450 ).
451
452
459
460set_initial_mode(_Stream, Options) :-
461 option(module(Module), Options),
462 !,
463 '$set_source_module'(Module).
464set_initial_mode(Stream, _) :-
465 stream_property(Stream, file_name(Path)),
466 source_file_property(Path, load_context(M, _, Opts)),
467 !,
468 '$set_source_module'(M),
469 ( option(dialect(Dialect), Opts)
470 -> expects_dialect(Dialect)
471 ; true
472 ).
473set_initial_mode(_, _) :-
474 '$set_source_module'(user).
475
479
480xref_input_stream(Stream) :-
481 xref_input(_, Var),
482 !,
483 Stream = Var.
484
489
490xref_push_op(Src, P, T, N0) :-
491 '$current_source_module'(M0),
492 strip_module(M0:N0, M, N),
493 ( is_list(N),
494 N \== []
495 -> maplist(push_op(Src, P, T, M), N)
496 ; push_op(Src, P, T, M, N)
497 ).
498
499push_op(Src, P, T, M0, N0) :-
500 strip_module(M0:N0, M, N),
501 Name = M:N,
502 valid_op(op(P,T,Name)),
503 push_op(P, T, Name),
504 assert_op(Src, op(P,T,Name)),
505 debug(xref(op), ':- ~w.', [op(P,T,Name)]).
506
507valid_op(op(P,T,M:N)) :-
508 atom(M),
509 valid_op_name(N),
510 integer(P),
511 between(0, 1200, P),
512 atom(T),
513 op_type(T).
514
515valid_op_name(N) :-
516 atom(N),
517 !.
518valid_op_name(N) :-
519 N == [].
520
521op_type(xf).
522op_type(yf).
523op_type(fx).
524op_type(fy).
525op_type(xfx).
526op_type(xfy).
527op_type(yfx).
528
532
533xref_set_prolog_flag(Flag, Value, Src, Line) :-
534 atom(Flag),
535 !,
536 assertz(xflag(Flag, Value, Src, Line)).
537xref_set_prolog_flag(_, _, _, _).
538
542
543xref_clean(Source) :-
544 prolog_canonical_source(Source, Src),
545 retractall(called(_, Src, _Origin, _Cond, _Line)),
546 retractall(dynamic(_, Src, Line)),
547 retractall(multifile(_, Src, Line)),
548 retractall(public(_, Src, Line)),
549 retractall(declared(_, _, Src, Line)),
550 retractall(defined(_, Src, Line)),
551 retractall(meta_goal(_, _, Src)),
552 retractall(foreign(_, Src, Line)),
553 retractall(constraint(_, Src, Line)),
554 retractall(imported(_, Src, _From)),
555 retractall(exported(_, Src)),
556 retractall(uses_file(_, Src, _)),
557 retractall(xmodule(_, Src)),
558 retractall(xop(Src, _)),
559 retractall(grammar_rule(_, Src)),
560 retractall(xoption(Src, _)),
561 retractall(xflag(_Name, _Value, Src, Line)),
562 retractall(source(Src, _)),
563 retractall(used_class(_, Src)),
564 retractall(defined_class(_, _, _, Src, _)),
565 retractall(mode(_, Src)),
566 retractall(module_comment(Src, _, _)),
567 retractall(pred_comment(_, Src, _, _)),
568 retractall(pred_comment_link(_, Src, _)),
569 retractall(pred_mode(_, Src, _)).
570
571
572 575
579
580xref_current_source(Source) :-
581 source(Source, _Time).
582
583
587
588xref_done(Source, Time) :-
589 prolog_canonical_source(Source, Src),
590 source(Src, Time).
591
592
611
612xref_called(Source, Called, By) :-
613 xref_called(Source, Called, By, _).
614
615xref_called(Source, Called, By, Cond) :-
616 canonical_source(Source, Src),
617 distinct(Called-By, called(Called, Src, By, Cond, _)).
618
619xref_called(Source, Called, By, Cond, Line) :-
620 canonical_source(Source, Src),
621 called(Called, Src, By, Cond, Line).
622
642
643xref_defined(Source, Called, How) :-
644 nonvar(Source),
645 !,
646 canonical_source(Source, Src),
647 xref_defined2(How, Src, Called).
648xref_defined(Source, Called, How) :-
649 xref_defined2(How, Src, Called),
650 canonical_source(Source, Src).
651
652xref_defined2(dynamic(Line), Src, Called) :-
653 dynamic(Called, Src, Line).
654xref_defined2(thread_local(Line), Src, Called) :-
655 thread_local(Called, Src, Line).
656xref_defined2(multifile(Line), Src, Called) :-
657 multifile(Called, Src, Line).
658xref_defined2(public(Line), Src, Called) :-
659 public(Called, Src, Line).
660xref_defined2(local(Line), Src, Called) :-
661 defined(Called, Src, Line).
662xref_defined2(foreign(Line), Src, Called) :-
663 foreign(Called, Src, Line).
664xref_defined2(constraint(Line), Src, Called) :-
665 ( constraint(Called, Src, Line)
666 -> true
667 ; declared(Called, chr_constraint, Src, Line)
668 ).
669xref_defined2(imported(From), Src, Called) :-
670 imported(Called, Src, From).
671xref_defined2(dcg, Src, Called) :-
672 grammar_rule(Called, Src).
673
674
679
680xref_definition_line(local(Line), Line).
681xref_definition_line(dynamic(Line), Line).
682xref_definition_line(thread_local(Line), Line).
683xref_definition_line(multifile(Line), Line).
684xref_definition_line(public(Line), Line).
685xref_definition_line(constraint(Line), Line).
686xref_definition_line(foreign(Line), Line).
687
688
692
693xref_exported(Source, Called) :-
694 prolog_canonical_source(Source, Src),
695 exported(Called, Src).
696
700
701xref_module(Source, Module) :-
702 nonvar(Source),
703 !,
704 prolog_canonical_source(Source, Src),
705 xmodule(Module, Src).
706xref_module(Source, Module) :-
707 xmodule(Module, Src),
708 prolog_canonical_source(Source, Src).
709
717
718xref_uses_file(Source, Spec, Path) :-
719 prolog_canonical_source(Source, Src),
720 uses_file(Spec, Src, Path).
721
729
730xref_op(Source, Op) :-
731 prolog_canonical_source(Source, Src),
732 xop(Src, Op).
733
739
740xref_prolog_flag(Source, Flag, Value, Line) :-
741 prolog_canonical_source(Source, Src),
742 xflag(Flag, Value, Src, Line).
743
744xref_built_in(Head) :-
745 system_predicate(Head).
746
747xref_used_class(Source, Class) :-
748 prolog_canonical_source(Source, Src),
749 used_class(Class, Src).
750
751xref_defined_class(Source, Class, local(Line, Super, Summary)) :-
752 prolog_canonical_source(Source, Src),
753 defined_class(Class, Super, Summary, Src, Line),
754 integer(Line),
755 !.
756xref_defined_class(Source, Class, file(File)) :-
757 prolog_canonical_source(Source, Src),
758 defined_class(Class, _, _, Src, file(File)).
759
760:- thread_local
761 current_cond/1,
762 source_line/1,
763 current_test_unit/2. 764
765current_source_line(Line) :-
766 source_line(Var),
767 !,
768 Line = Var.
769
775
776collect(Src, File, In, Options) :-
777 ( Src == File
778 -> SrcSpec = Line
779 ; SrcSpec = (File:Line)
780 ),
781 ( current_prolog_flag(xref_store_comments, OldStore)
782 -> true
783 ; OldStore = false
784 ),
785 option(comments(CommentHandling), Options, collect),
786 ( CommentHandling == ignore
787 -> CommentOptions = [],
788 Comments = []
789 ; CommentHandling == store
790 -> CommentOptions = [ process_comment(true) ],
791 Comments = [],
792 set_prolog_flag(xref_store_comments, true)
793 ; CommentOptions = [ comments(Comments) ]
794 ),
795 repeat,
796 E = error(_,_),
797 catch(prolog_read_source_term(
798 In, Term, Expanded,
799 [ term_position(TermPos)
800 | CommentOptions
801 ]),
802 E, report_syntax_error(E, Src, [])),
803 update_condition(Term),
804 stream_position_data(line_count, TermPos, Line),
805 setup_call_cleanup(
806 asserta(source_line(SrcSpec), Ref),
807 catch(process(Expanded, Comments, Term, TermPos, Src, EOF),
808 E, print_message(error, E)),
809 erase(Ref)),
810 EOF == true,
811 !,
812 set_prolog_flag(xref_store_comments, OldStore).
813
814report_syntax_error(_, _, Options) :-
815 option(silent(true), Options),
816 !,
817 fail.
818report_syntax_error(E, Src, _Options) :-
819 ( verbose(Src)
820 -> print_message(error, E)
821 ; true
822 ),
823 fail.
824
828
829update_condition((:-Directive)) :-
830 !,
831 update_cond(Directive).
832update_condition(_).
833
834update_cond(if(Cond)) :-
835 !,
836 asserta(current_cond(Cond)).
837update_cond(else) :-
838 retract(current_cond(C0)),
839 !,
840 assert(current_cond(\+C0)).
841update_cond(elif(Cond)) :-
842 retract(current_cond(C0)),
843 !,
844 assert(current_cond((\+C0,Cond))).
845update_cond(endif) :-
846 retract(current_cond(_)),
847 !.
848update_cond(_).
849
854
855current_condition(Condition) :-
856 \+ current_cond(_),
857 !,
858 Condition = true.
859current_condition(Condition) :-
860 findall(C, current_cond(C), List),
861 list_to_conj(List, Condition).
862
863list_to_conj([], true).
864list_to_conj([C], C) :- !.
865list_to_conj([H|T], (H,C)) :-
866 list_to_conj(T, C).
867
868
869 872
882
883process(Expanded, Comments, Term0, TermPos, Src, EOF) :-
884 is_list(Expanded), 885 !,
886 ( member(Term, Expanded),
887 process(Term, Term0, Src),
888 Term == end_of_file
889 -> EOF = true
890 ; EOF = false
891 ),
892 xref_comments(Comments, TermPos, Src).
893process(end_of_file, _, _, _, _, true) :-
894 !.
895process(Term, Comments, Term0, TermPos, Src, false) :-
896 process(Term, Term0, Src),
897 xref_comments(Comments, TermPos, Src).
898
900
901process(_, Term0, _) :-
902 ignore_raw_term(Term0),
903 !.
904process(Head :- Body, Head0 --> _, Src) :-
905 pi_head(F/A, Head),
906 pi_head(F/A0, Head0),
907 A =:= A0 + 2,
908 !,
909 assert_grammar_rule(Src, Head),
910 process((Head :- Body), Src).
911process(Term, _Term0, Src) :-
912 process(Term, Src).
913
914ignore_raw_term((:- predicate_options(_,_,_))).
915
917
918process(Var, _) :-
919 var(Var),
920 !. 921process(end_of_file, _) :- !.
922process((:- Directive), Src) :-
923 !,
924 process_directive(Directive, Src),
925 !.
926process((?- Directive), Src) :-
927 !,
928 process_directive(Directive, Src),
929 !.
930process((Head :- Body), Src) :-
931 !,
932 assert_defined(Src, Head),
933 process_body(Body, Head, Src).
934process((Left => Body), Src) :-
935 !,
936 ( nonvar(Left),
937 Left = (Head, Guard)
938 -> assert_defined(Src, Head),
939 process_body(Guard, Head, Src),
940 process_body(Body, Head, Src)
941 ; assert_defined(Src, Left),
942 process_body(Body, Left, Src)
943 ).
944process(?=>(Head, Body), Src) :-
945 !,
946 assert_defined(Src, Head),
947 process_body(Body, Head, Src).
948process('$source_location'(_File, _Line):Clause, Src) :-
949 !,
950 process(Clause, Src).
951process(Term, Src) :-
952 process_chr(Term, Src),
953 !.
954process(M:(Head :- Body), Src) :-
955 !,
956 process((M:Head :- M:Body), Src).
957process(Head, Src) :-
958 assert_defined(Src, Head).
959
960
961 964
966
([], _Pos, _Src).
968:- if(current_predicate(parse_comment/3)). 969xref_comments([Pos-Comment|T], TermPos, Src) :-
970 ( Pos @> TermPos 971 -> true
972 ; stream_position_data(line_count, Pos, Line),
973 FilePos = Src:Line,
974 ( parse_comment(Comment, FilePos, Parsed)
975 -> assert_comments(Parsed, Src)
976 ; true
977 ),
978 xref_comments(T, TermPos, Src)
979 ).
980
([], _).
982assert_comments([H|T], Src) :-
983 assert_comment(H, Src),
984 assert_comments(T, Src).
985
(section(_Id, Title, Comment), Src) :-
987 assertz(module_comment(Src, Title, Comment)).
988assert_comment(predicate(PI, Summary, Comment), Src) :-
989 pi_to_head(PI, Src, Head),
990 assertz(pred_comment(Head, Src, Summary, Comment)).
991assert_comment(link(PI, PITo), Src) :-
992 pi_to_head(PI, Src, Head),
993 pi_to_head(PITo, Src, HeadTo),
994 assertz(pred_comment_link(Head, Src, HeadTo)).
995assert_comment(mode(Head, Det), Src) :-
996 assertz(pred_mode(Head, Src, Det)).
997
998pi_to_head(PI, Src, Head) :-
999 pi_to_head(PI, Head0),
1000 ( Head0 = _:_
1001 -> strip_module(Head0, M, Plain),
1002 ( xmodule(M, Src)
1003 -> Head = Plain
1004 ; Head = M:Plain
1005 )
1006 ; Head = Head0
1007 ).
1008:- endif. 1009
1013
(Source, Title, Comment) :-
1015 canonical_source(Source, Src),
1016 module_comment(Src, Title, Comment).
1017
1021
(Source, Head, Summary, Comment) :-
1023 canonical_source(Source, Src),
1024 ( pred_comment(Head, Src, Summary, Comment)
1025 ; pred_comment_link(Head, Src, HeadTo),
1026 pred_comment(HeadTo, Src, Summary, Comment)
1027 ).
1028
1033
1034xref_mode(Source, Mode, Det) :-
1035 canonical_source(Source, Src),
1036 pred_mode(Mode, Src, Det).
1037
1042
1043xref_option(Source, Option) :-
1044 canonical_source(Source, Src),
1045 xoption(Src, Option).
1046
1047
1048 1051
1052process_directive(Var, _) :-
1053 var(Var),
1054 !. 1055process_directive(Dir, _Src) :-
1056 debug(xref(directive), 'Processing :- ~q', [Dir]),
1057 fail.
1058process_directive((A,B), Src) :- 1059 !,
1060 process_directive(A, Src), 1061 process_directive(B, Src).
1062process_directive(List, Src) :-
1063 is_list(List),
1064 !,
1065 process_directive(consult(List), Src).
1066process_directive(use_module(File, Import), Src) :-
1067 process_use_module2(File, Import, Src, false).
1068process_directive(autoload(File, Import), Src) :-
1069 process_use_module2(File, Import, Src, false).
1070process_directive(require(Import), Src) :-
1071 process_requires(Import, Src).
1072process_directive(expects_dialect(Dialect), Src) :-
1073 process_directive(use_module(library(dialect/Dialect)), Src),
1074 expects_dialect(Dialect).
1075process_directive(reexport(File, Import), Src) :-
1076 process_use_module2(File, Import, Src, true).
1077process_directive(reexport(Modules), Src) :-
1078 process_use_module(Modules, Src, true).
1079process_directive(autoload(Modules), Src) :-
1080 process_use_module(Modules, Src, false).
1081process_directive(use_module(Modules), Src) :-
1082 process_use_module(Modules, Src, false).
1083process_directive(consult(Modules), Src) :-
1084 process_use_module(Modules, Src, false).
1085process_directive(ensure_loaded(Modules), Src) :-
1086 process_use_module(Modules, Src, false).
1087process_directive(load_files(Files, _Options), Src) :-
1088 process_use_module(Files, Src, false).
1089process_directive(include(Files), Src) :-
1090 process_include(Files, Src).
1091process_directive(dynamic(Dynamic), Src) :-
1092 process_predicates(assert_dynamic, Dynamic, Src).
1093process_directive(dynamic(Dynamic, _Options), Src) :-
1094 process_predicates(assert_dynamic, Dynamic, Src).
1095process_directive(thread_local(Dynamic), Src) :-
1096 process_predicates(assert_thread_local, Dynamic, Src).
1097process_directive(multifile(Dynamic), Src) :-
1098 process_predicates(assert_multifile, Dynamic, Src).
1099process_directive(public(Public), Src) :-
1100 process_predicates(assert_public, Public, Src).
1101process_directive(export(Export), Src) :-
1102 process_predicates(assert_export, Export, Src).
1103process_directive(import(Import), Src) :-
1104 process_import(Import, Src).
1105process_directive(module(Module, Export), Src) :-
1106 assert_module(Src, Module),
1107 assert_module_export(Src, Export).
1108process_directive(module(Module, Export, Import), Src) :-
1109 assert_module(Src, Module),
1110 assert_module_export(Src, Export),
1111 assert_module3(Import, Src).
1112process_directive(begin_tests(Unit, _Options), Src) :-
1113 enter_test_unit(Unit, Src).
1114process_directive(begin_tests(Unit), Src) :-
1115 enter_test_unit(Unit, Src).
1116process_directive(end_tests(Unit), Src) :-
1117 leave_test_unit(Unit, Src).
1118process_directive('$set_source_module'(system), Src) :-
1119 assert_module(Src, system). 1120process_directive(pce_begin_class_definition(Name, Meta, Super, Doc), Src) :-
1121 assert_defined_class(Src, Name, Meta, Super, Doc).
1122process_directive(pce_autoload(Name, From), Src) :-
1123 assert_defined_class(Src, Name, imported_from(From)).
1124
1125process_directive(op(P, A, N), Src) :-
1126 xref_push_op(Src, P, A, N).
1127process_directive(set_prolog_flag(Flag, Value), Src) :-
1128 ( Flag == character_escapes
1129 -> set_prolog_flag(character_escapes, Value)
1130 ; true
1131 ),
1132 current_source_line(Line),
1133 xref_set_prolog_flag(Flag, Value, Src, Line).
1134process_directive(style_check(X), _) :-
1135 style_check(X).
1136process_directive(encoding(Enc), _) :-
1137 ( xref_input_stream(Stream)
1138 -> catch(set_stream(Stream, encoding(Enc)), error(_,_), true)
1139 ; true 1140 ).
1141process_directive(pce_expansion:push_compile_operators, _) :-
1142 '$current_source_module'(SM),
1143 call(pce_expansion:push_compile_operators(SM)). 1144process_directive(pce_expansion:pop_compile_operators, _) :-
1145 call(pce_expansion:pop_compile_operators).
1146process_directive(meta_predicate(Meta), Src) :-
1147 process_meta_predicate(Meta, Src).
1148process_directive(arithmetic_function(FSpec), Src) :-
1149 arith_callable(FSpec, Goal),
1150 !,
1151 current_source_line(Line),
1152 assert_called(Src, '<directive>'(Line), Goal, Line).
1153process_directive(format_predicate(_, Goal), Src) :-
1154 !,
1155 current_source_line(Line),
1156 assert_called(Src, '<directive>'(Line), Goal, Line).
1157process_directive(if(Cond), Src) :-
1158 !,
1159 current_source_line(Line),
1160 assert_called(Src, '<directive>'(Line), Cond, Line).
1161process_directive(elif(Cond), Src) :-
1162 !,
1163 current_source_line(Line),
1164 assert_called(Src, '<directive>'(Line), Cond, Line).
1165process_directive(else, _) :- !.
1166process_directive(endif, _) :- !.
1167process_directive(Goal, Src) :-
1168 current_source_line(Line),
1169 process_body(Goal, '<directive>'(Line), Src).
1170
1174
1175process_meta_predicate((A,B), Src) :-
1176 !,
1177 process_meta_predicate(A, Src),
1178 process_meta_predicate(B, Src).
1179process_meta_predicate(Decl, Src) :-
1180 process_meta_head(Src, Decl).
1181
1182process_meta_head(Src, Decl) :- 1183 compound(Decl),
1184 compound_name_arity(Decl, Name, Arity),
1185 compound_name_arity(Head, Name, Arity),
1186 meta_args(1, Arity, Decl, Head, Meta),
1187 ( ( prolog:meta_goal(Head, _)
1188 ; prolog:called_by(Head, _, _, _)
1189 ; prolog:called_by(Head, _)
1190 ; meta_goal(Head, _)
1191 )
1192 -> true
1193 ; assert(meta_goal(Head, Meta, Src))
1194 ).
1195
1196meta_args(I, Arity, _, _, []) :-
1197 I > Arity,
1198 !.
1199meta_args(I, Arity, Decl, Head, [H|T]) :- 1200 arg(I, Decl, 0),
1201 !,
1202 arg(I, Head, H),
1203 I2 is I + 1,
1204 meta_args(I2, Arity, Decl, Head, T).
1205meta_args(I, Arity, Decl, Head, [H|T]) :- 1206 arg(I, Decl, ^),
1207 !,
1208 arg(I, Head, EH),
1209 setof_goal(EH, H),
1210 I2 is I + 1,
1211 meta_args(I2, Arity, Decl, Head, T).
1212meta_args(I, Arity, Decl, Head, [//(H)|T]) :-
1213 arg(I, Decl, //),
1214 !,
1215 arg(I, Head, H),
1216 I2 is I + 1,
1217 meta_args(I2, Arity, Decl, Head, T).
1218meta_args(I, Arity, Decl, Head, [H+A|T]) :- 1219 arg(I, Decl, A),
1220 integer(A), A > 0,
1221 !,
1222 arg(I, Head, H),
1223 I2 is I + 1,
1224 meta_args(I2, Arity, Decl, Head, T).
1225meta_args(I, Arity, Decl, Head, Meta) :-
1226 I2 is I + 1,
1227 meta_args(I2, Arity, Decl, Head, Meta).
1228
1229
1230 1233
1240
1241xref_meta(Source, Head, Called) :-
1242 canonical_source(Source, Src),
1243 xref_meta_src(Head, Called, Src).
1244
1257
1258xref_meta_src(Head, Called, Src) :-
1259 meta_goal(Head, Called, Src),
1260 !.
1261xref_meta_src(Head, Called, _) :-
1262 xref_meta(Head, Called),
1263 !.
1264xref_meta_src(Head, Called, _) :-
1265 compound(Head),
1266 compound_name_arity(Head, Name, Arity),
1267 apply_pred(Name),
1268 Arity > 5,
1269 !,
1270 Extra is Arity - 1,
1271 arg(1, Head, G),
1272 Called = [G+Extra].
1273xref_meta_src(Head, Called, _) :-
1274 with_xref(predicate_property('$xref_tmp':Head, meta_predicate(Meta))),
1275 !,
1276 Meta =.. [_|Args],
1277 meta_args(Args, 1, Head, Called).
1278
1279meta_args([], _, _, []).
1280meta_args([H0|T0], I, Head, [H|T]) :-
1281 xargs(H0, N),
1282 !,
1283 arg(I, Head, A),
1284 ( N == 0
1285 -> H = A
1286 ; H = (A+N)
1287 ),
1288 I2 is I+1,
1289 meta_args(T0, I2, Head, T).
1290meta_args([_|T0], I, Head, T) :-
1291 I2 is I+1,
1292 meta_args(T0, I2, Head, T).
1293
1294xargs(N, N) :- integer(N), !.
1295xargs(//, 2).
1296xargs(^, 0).
1297
1298apply_pred(call). 1299apply_pred(maplist). 1300
1301xref_meta((A, B), [A, B]).
1302xref_meta((A; B), [A, B]).
1303xref_meta((A| B), [A, B]).
1304xref_meta((A -> B), [A, B]).
1305xref_meta((A *-> B), [A, B]).
1306xref_meta(findall(_V,G,_L), [G]).
1307xref_meta(findall(_V,G,_L,_T), [G]).
1308xref_meta(findnsols(_N,_V,G,_L), [G]).
1309xref_meta(findnsols(_N,_V,G,_L,_T), [G]).
1310xref_meta(setof(_V, EG, _L), [G]) :-
1311 setof_goal(EG, G).
1312xref_meta(bagof(_V, EG, _L), [G]) :-
1313 setof_goal(EG, G).
1314xref_meta(forall(A, B), [A, B]).
1315xref_meta(maplist(G,_), [G+1]).
1316xref_meta(maplist(G,_,_), [G+2]).
1317xref_meta(maplist(G,_,_,_), [G+3]).
1318xref_meta(maplist(G,_,_,_,_), [G+4]).
1319xref_meta(map_list_to_pairs(G,_,_), [G+2]).
1320xref_meta(map_assoc(G, _), [G+1]).
1321xref_meta(map_assoc(G, _, _), [G+2]).
1322xref_meta(checklist(G, _L), [G+1]).
1323xref_meta(sublist(G, _, _), [G+1]).
1324xref_meta(include(G, _, _), [G+1]).
1325xref_meta(exclude(G, _, _), [G+1]).
1326xref_meta(partition(G, _, _, _, _), [G+2]).
1327xref_meta(partition(G, _, _, _),[G+1]).
1328xref_meta(call(G), [G]).
1329xref_meta(call(G, _), [G+1]).
1330xref_meta(call(G, _, _), [G+2]).
1331xref_meta(call(G, _, _, _), [G+3]).
1332xref_meta(call(G, _, _, _, _), [G+4]).
1333xref_meta(not(G), [G]).
1334xref_meta(notrace(G), [G]).
1335xref_meta('$notrace'(G), [G]).
1336xref_meta(\+(G), [G]).
1337xref_meta(ignore(G), [G]).
1338xref_meta(once(G), [G]).
1339xref_meta(initialization(G), [G]).
1340xref_meta(initialization(G,_), [G]).
1341xref_meta(retract(Rule), [G]) :- head_of(Rule, G).
1342xref_meta(clause(G, _), [G]).
1343xref_meta(clause(G, _, _), [G]).
1344xref_meta(phrase(G, _A), [//(G)]).
1345xref_meta(phrase(G, _A, _R), [//(G)]).
1346xref_meta(call_dcg(G, _A, _R), [//(G)]).
1347xref_meta(phrase_from_file(G,_),[//(G)]).
1348xref_meta(catch(A, _, B), [A, B]).
1349xref_meta(catch_with_backtrace(A, _, B), [A, B]).
1350xref_meta(thread_create(A,_,_), [A]).
1351xref_meta(thread_create(A,_), [A]).
1352xref_meta(thread_signal(_,A), [A]).
1353xref_meta(thread_idle(A,_), [A]).
1354xref_meta(thread_at_exit(A), [A]).
1355xref_meta(thread_initialization(A), [A]).
1356xref_meta(engine_create(_,A,_), [A]).
1357xref_meta(engine_create(_,A,_,_), [A]).
1358xref_meta(transaction(A), [A]).
1359xref_meta(transaction(A,B,_), [A,B]).
1360xref_meta(snapshot(A), [A]).
1361xref_meta(predsort(A,_,_), [A+3]).
1362xref_meta(call_cleanup(A, B), [A, B]).
1363xref_meta(call_cleanup(A, _, B),[A, B]).
1364xref_meta(setup_call_cleanup(A, B, C),[A, B, C]).
1365xref_meta(setup_call_catcher_cleanup(A, B, _, C),[A, B, C]).
1366xref_meta(call_residue_vars(A,_), [A]).
1367xref_meta(with_mutex(_,A), [A]).
1368xref_meta(assume(G), [G]). 1369xref_meta(assertion(G), [G]). 1370xref_meta(freeze(_, G), [G]).
1371xref_meta(when(C, A), [C, A]).
1372xref_meta(time(G), [G]). 1373xref_meta(call_time(G, _), [G]). 1374xref_meta(call_time(G, _, _), [G]). 1375xref_meta(profile(G), [G]).
1376xref_meta(at_halt(G), [G]).
1377xref_meta(call_with_time_limit(_, G), [G]).
1378xref_meta(call_with_depth_limit(G, _, _), [G]).
1379xref_meta(call_with_inference_limit(G, _, _), [G]).
1380xref_meta(alarm(_, G, _), [G]).
1381xref_meta(alarm(_, G, _, _), [G]).
1382xref_meta('$add_directive_wic'(G), [G]).
1383xref_meta(with_output_to(_, G), [G]).
1384xref_meta(if(G), [G]).
1385xref_meta(elif(G), [G]).
1386xref_meta(meta_options(G,_,_), [G+1]).
1387xref_meta(on_signal(_,_,H), [H+1]) :- H \== default.
1388xref_meta(distinct(G), [G]). 1389xref_meta(distinct(_, G), [G]).
1390xref_meta(order_by(_, G), [G]).
1391xref_meta(limit(_, G), [G]).
1392xref_meta(offset(_, G), [G]).
1393xref_meta(reset(G,_,_), [G]).
1394xref_meta(prolog_listen(Ev,G), [G+N]) :- event_xargs(Ev, N).
1395xref_meta(prolog_listen(Ev,G,_),[G+N]) :- event_xargs(Ev, N).
1396xref_meta(tnot(G), [G]).
1397xref_meta(not_exists(G), [G]).
1398xref_meta(with_tty_raw(G), [G]).
1399xref_meta(residual_goals(G), [G+2]).
1400
1401 1402xref_meta(pce_global(_, new(_)), _) :- !, fail.
1403xref_meta(pce_global(_, B), [B+1]).
1404xref_meta(ifmaintainer(G), [G]). 1405xref_meta(listen(_, G), [G]). 1406xref_meta(listen(_, _, G), [G]).
1407xref_meta(in_pce_thread(G), [G]).
1408
1409xref_meta(G, Meta) :- 1410 prolog:meta_goal(G, Meta).
1411xref_meta(G, Meta) :- 1412 meta_goal(G, Meta).
1413
1414setof_goal(EG, G) :-
1415 var(EG), !, G = EG.
1416setof_goal(_^EG, G) :-
1417 !,
1418 setof_goal(EG, G).
1419setof_goal(G, G).
1420
1421event_xargs(abort, 0).
1422event_xargs(erase, 1).
1423event_xargs(break, 3).
1424event_xargs(frame_finished, 1).
1425event_xargs(thread_exit, 1).
1426event_xargs(this_thread_exit, 0).
1427event_xargs(PI, 2) :- pi_to_head(PI, _).
1428
1432
1433head_of(Var, _) :-
1434 var(Var), !, fail.
1435head_of((Head :- _), Head).
1436head_of(Head, Head).
1437
1443
1444xref_hook(Hook) :-
1445 prolog:hook(Hook).
1446xref_hook(Hook) :-
1447 hook(Hook).
1448
1449
1450hook(attr_portray_hook(_,_)).
1451hook(attr_unify_hook(_,_)).
1452hook(attribute_goals(_,_,_)).
1453hook(goal_expansion(_,_)).
1454hook(term_expansion(_,_)).
1455hook(resource(_,_,_)).
1456hook('$pred_option'(_,_,_,_)).
1457
1458hook(emacs_prolog_colours:goal_classification(_,_)).
1459hook(emacs_prolog_colours:goal_colours(_,_)).
1460hook(emacs_prolog_colours:identify(_,_)).
1461hook(emacs_prolog_colours:style(_,_)).
1462hook(emacs_prolog_colours:term_colours(_,_)).
1463hook(pce_principal:get_implementation(_,_,_,_)).
1464hook(pce_principal:pce_class(_,_,_,_,_,_)).
1465hook(pce_principal:pce_lazy_get_method(_,_,_)).
1466hook(pce_principal:pce_lazy_send_method(_,_,_)).
1467hook(pce_principal:pce_uses_template(_,_)).
1468hook(pce_principal:send_implementation(_,_,_)).
1469hook(predicate_options:option_decl(_,_,_)).
1470hook(prolog:debug_control_hook(_)).
1471hook(prolog:error_message(_,_,_)).
1472hook(prolog:expand_answer(_,_,_)).
1473hook(prolog:general_exception(_,_)).
1474hook(prolog:help_hook(_)).
1475hook(prolog:locate_clauses(_,_)).
1476hook(prolog:message(_,_,_)).
1477hook(prolog:message_context(_,_,_)).
1478hook(prolog:message_line_element(_,_)).
1479hook(prolog:message_location(_,_,_)).
1480hook(prolog:predicate_summary(_,_)).
1481hook(prolog:prolog_exception_hook(_,_,_,_,_)).
1482hook(prolog:residual_goals(_,_)).
1483hook(prolog:show_profile_hook(_,_)).
1484hook(prolog_edit:load).
1485hook(prolog_edit:locate(_,_,_)).
1486hook(sandbox:safe_directive(_)).
1487hook(sandbox:safe_global_variable(_)).
1488hook(sandbox:safe_meta(_,_)).
1489hook(sandbox:safe_meta_predicate(_)).
1490hook(sandbox:safe_primitive(_)).
1491hook(sandbox:safe_prolog_flag(_,_)).
1492hook(shlib:unload_all_foreign_libraries).
1493hook(system:'$foreign_registered'(_, _)).
1494hook(user:exception(_,_,_)).
1495hook(user:expand_answer(_,_)).
1496hook(user:expand_query(_,_,_,_)).
1497hook(user:file_search_path(_,_)).
1498hook(user:library_directory(_)).
1499hook(user:message_hook(_,_,_)).
1500hook(user:portray(_)).
1501hook(user:prolog_clause_name(_,_)).
1502hook(user:prolog_list_goal(_)).
1503hook(user:prolog_predicate_name(_,_)).
1504hook(user:prolog_trace_interception(_,_,_,_)).
1505
1509
1510arith_callable(Var, _) :-
1511 var(Var), !, fail.
1512arith_callable(Module:Spec, Module:Goal) :-
1513 !,
1514 arith_callable(Spec, Goal).
1515arith_callable(Name/Arity, Goal) :-
1516 PredArity is Arity + 1,
1517 functor(Goal, Name, PredArity).
1518
1527
1528process_body(Body, Origin, Src) :-
1529 forall(limit(100, process_goal(Body, Origin, Src, _Partial)),
1530 true).
1531
1536
1537process_goal(Var, _, _, _) :-
1538 var(Var),
1539 !.
1540process_goal(_:Goal, _, _, _) :-
1541 var(Goal),
1542 !.
1543process_goal(Goal, Origin, Src, P) :-
1544 Goal = (_,_), 1545 !,
1546 phrase(conjunction(Goal), Goals),
1547 process_conjunction(Goals, Origin, Src, P).
1548process_goal(Goal, Origin, Src, _) :- 1549 Goal = (_;_), 1550 !,
1551 phrase(disjunction(Goal), Goals),
1552 forall(member(G, Goals),
1553 process_body(G, Origin, Src)).
1554process_goal(Goal, Origin, Src, P) :-
1555 ( ( xmodule(M, Src)
1556 -> true
1557 ; M = user
1558 ),
1559 pi_head(PI, M:Goal),
1560 ( current_predicate(PI),
1561 predicate_property(M:Goal, imported_from(IM))
1562 -> true
1563 ; PI = M:Name/Arity,
1564 '$find_library'(M, Name, Arity, IM, _Library)
1565 -> true
1566 ; IM = M
1567 ),
1568 prolog:called_by(Goal, IM, M, Called)
1569 ; prolog:called_by(Goal, Called)
1570 ),
1571 !,
1572 must_be(list, Called),
1573 current_source_line(Here),
1574 assert_called(Src, Origin, Goal, Here),
1575 process_called_list(Called, Origin, Src, P).
1576process_goal(Goal, Origin, Src, _) :-
1577 process_xpce_goal(Goal, Origin, Src),
1578 !.
1579process_goal(load_foreign_library(File), _Origin, Src, _) :-
1580 process_foreign(File, Src).
1581process_goal(load_foreign_library(File, _Init), _Origin, Src, _) :-
1582 process_foreign(File, Src).
1583process_goal(use_foreign_library(File), _Origin, Src, _) :-
1584 process_foreign(File, Src).
1585process_goal(use_foreign_library(File, _Init), _Origin, Src, _) :-
1586 process_foreign(File, Src).
1587process_goal(Goal, Origin, Src, P) :-
1588 xref_meta_src(Goal, Metas, Src),
1589 !,
1590 current_source_line(Here),
1591 assert_called(Src, Origin, Goal, Here),
1592 process_called_list(Metas, Origin, Src, P).
1593process_goal(Goal, Origin, Src, _) :-
1594 asserting_goal(Goal, Rule),
1595 !,
1596 current_source_line(Here),
1597 assert_called(Src, Origin, Goal, Here),
1598 process_assert(Rule, Origin, Src).
1599process_goal(Goal, Origin, Src, P) :-
1600 partial_evaluate(Goal, P),
1601 current_source_line(Here),
1602 assert_called(Src, Origin, Goal, Here).
1603
1604disjunction(Var) --> {var(Var), !}, [Var].
1605disjunction((A;B)) --> !, disjunction(A), disjunction(B).
1606disjunction(G) --> [G].
1607
1608conjunction(Var) --> {var(Var), !}, [Var].
1609conjunction((A,B)) --> !, conjunction(A), conjunction(B).
1610conjunction(G) --> [G].
1611
1612shares_vars(RVars, T) :-
1613 term_variables(T, TVars0),
1614 sort(TVars0, TVars),
1615 ord_intersect(RVars, TVars).
1616
1617process_conjunction([], _, _, _).
1618process_conjunction([Disj|Rest], Origin, Src, P) :-
1619 nonvar(Disj),
1620 Disj = (_;_),
1621 Rest \== [],
1622 !,
1623 phrase(disjunction(Disj), Goals),
1624 term_variables(Rest, RVars0),
1625 sort(RVars0, RVars),
1626 partition(shares_vars(RVars), Goals, Sharing, NonSHaring),
1627 forall(member(G, NonSHaring),
1628 process_body(G, Origin, Src)),
1629 ( Sharing == []
1630 -> true
1631 ; maplist(term_variables, Sharing, GVars0),
1632 append(GVars0, GVars1),
1633 sort(GVars1, GVars),
1634 ord_intersection(GVars, RVars, SVars),
1635 VT =.. [v|SVars],
1636 findall(VT,
1637 ( member(G, Sharing),
1638 process_goal(G, Origin, Src, PS),
1639 PS == true
1640 ),
1641 Alts0),
1642 ( Alts0 == []
1643 -> true
1644 ; ( true
1645 ; P = true,
1646 sort(Alts0, Alts1),
1647 variants(Alts1, 10, Alts),
1648 member(VT, Alts)
1649 )
1650 )
1651 ),
1652 process_conjunction(Rest, Origin, Src, P).
1653process_conjunction([H|T], Origin, Src, P) :-
1654 process_goal(H, Origin, Src, P),
1655 process_conjunction(T, Origin, Src, P).
1656
1657
1658process_called_list([], _, _, _).
1659process_called_list([H|T], Origin, Src, P) :-
1660 process_meta(H, Origin, Src, P),
1661 process_called_list(T, Origin, Src, P).
1662
1663process_meta(A+N, Origin, Src, P) :-
1664 !,
1665 ( extend(A, N, AX)
1666 -> process_goal(AX, Origin, Src, P)
1667 ; true
1668 ).
1669process_meta(//(A), Origin, Src, P) :-
1670 !,
1671 process_dcg_goal(A, Origin, Src, P).
1672process_meta(G, Origin, Src, P) :-
1673 process_goal(G, Origin, Src, P).
1674
1679
1680process_dcg_goal(Var, _, _, _) :-
1681 var(Var),
1682 !.
1683process_dcg_goal((A,B), Origin, Src, P) :-
1684 !,
1685 process_dcg_goal(A, Origin, Src, P),
1686 process_dcg_goal(B, Origin, Src, P).
1687process_dcg_goal((A;B), Origin, Src, P) :-
1688 !,
1689 process_dcg_goal(A, Origin, Src, P),
1690 process_dcg_goal(B, Origin, Src, P).
1691process_dcg_goal((A|B), Origin, Src, P) :-
1692 !,
1693 process_dcg_goal(A, Origin, Src, P),
1694 process_dcg_goal(B, Origin, Src, P).
1695process_dcg_goal((A->B), Origin, Src, P) :-
1696 !,
1697 process_dcg_goal(A, Origin, Src, P),
1698 process_dcg_goal(B, Origin, Src, P).
1699process_dcg_goal((A*->B), Origin, Src, P) :-
1700 !,
1701 process_dcg_goal(A, Origin, Src, P),
1702 process_dcg_goal(B, Origin, Src, P).
1703process_dcg_goal({Goal}, Origin, Src, P) :-
1704 !,
1705 process_goal(Goal, Origin, Src, P).
1706process_dcg_goal(List, _Origin, _Src, _) :-
1707 is_list(List),
1708 !. 1709process_dcg_goal(List, _Origin, _Src, _) :-
1710 string(List),
1711 !. 1712process_dcg_goal(Callable, Origin, Src, P) :-
1713 extend(Callable, 2, Goal),
1714 !,
1715 process_goal(Goal, Origin, Src, P).
1716process_dcg_goal(_, _, _, _).
1717
1718
1719extend(Var, _, _) :-
1720 var(Var), !, fail.
1721extend(M:G, N, M:GX) :-
1722 !,
1723 callable(G),
1724 extend(G, N, GX).
1725extend(G, N, GX) :-
1726 ( compound(G)
1727 -> compound_name_arguments(G, Name, Args),
1728 length(Rest, N),
1729 append(Args, Rest, NArgs),
1730 compound_name_arguments(GX, Name, NArgs)
1731 ; atom(G)
1732 -> length(NArgs, N),
1733 compound_name_arguments(GX, G, NArgs)
1734 ).
1735
1736asserting_goal(assert(Rule), Rule).
1737asserting_goal(asserta(Rule), Rule).
1738asserting_goal(assertz(Rule), Rule).
1739asserting_goal(assert(Rule,_), Rule).
1740asserting_goal(asserta(Rule,_), Rule).
1741asserting_goal(assertz(Rule,_), Rule).
1742
1743process_assert(0, _, _) :- !. 1744process_assert((_:-Body), Origin, Src) :-
1745 !,
1746 process_body(Body, Origin, Src).
1747process_assert(_, _, _).
1748
1750
1751variants([], _, []).
1752variants([H|T], Max, List) :-
1753 variants(T, H, Max, List).
1754
1755variants([], H, _, [H]).
1756variants(_, _, 0, []) :- !.
1757variants([H|T], V, Max, List) :-
1758 ( H =@= V
1759 -> variants(T, V, Max, List)
1760 ; List = [V|List2],
1761 Max1 is Max-1,
1762 variants(T, H, Max1, List2)
1763 ).
1764
1776
1777partial_evaluate(Goal, P) :-
1778 eval(Goal),
1779 !,
1780 P = true.
1781partial_evaluate(_, _).
1782
1783eval(X = Y) :-
1784 unify_with_occurs_check(X, Y).
1785
1786 1789
1790enter_test_unit(Unit, _Src) :-
1791 current_source_line(Line),
1792 asserta(current_test_unit(Unit, Line)).
1793
1794leave_test_unit(Unit, _Src) :-
1795 retractall(current_test_unit(Unit, _)).
1796
1797
1798 1801
1802pce_goal(new(_,_), new(-, new)).
1803pce_goal(send(_,_), send(arg, msg)).
1804pce_goal(send_class(_,_,_), send_class(arg, arg, msg)).
1805pce_goal(get(_,_,_), get(arg, msg, -)).
1806pce_goal(get_class(_,_,_,_), get_class(arg, arg, msg, -)).
1807pce_goal(get_chain(_,_,_), get_chain(arg, msg, -)).
1808pce_goal(get_object(_,_,_), get_object(arg, msg, -)).
1809
1810process_xpce_goal(G, Origin, Src) :-
1811 pce_goal(G, Process),
1812 !,
1813 current_source_line(Here),
1814 assert_called(Src, Origin, G, Here),
1815 ( arg(I, Process, How),
1816 arg(I, G, Term),
1817 process_xpce_arg(How, Term, Origin, Src),
1818 fail
1819 ; true
1820 ).
1821
1822process_xpce_arg(new, Term, Origin, Src) :-
1823 callable(Term),
1824 process_new(Term, Origin, Src).
1825process_xpce_arg(arg, Term, Origin, Src) :-
1826 compound(Term),
1827 process_new(Term, Origin, Src).
1828process_xpce_arg(msg, Term, Origin, Src) :-
1829 compound(Term),
1830 ( arg(_, Term, Arg),
1831 process_xpce_arg(arg, Arg, Origin, Src),
1832 fail
1833 ; true
1834 ).
1835
1836process_new(_M:_Term, _, _) :- !. 1837process_new(Term, Origin, Src) :-
1838 assert_new(Src, Origin, Term),
1839 ( compound(Term),
1840 arg(_, Term, Arg),
1841 process_xpce_arg(arg, Arg, Origin, Src),
1842 fail
1843 ; true
1844 ).
1845
1846assert_new(_, _, Term) :-
1847 \+ callable(Term),
1848 !.
1849assert_new(Src, Origin, Control) :-
1850 functor_name(Control, Class),
1851 pce_control_class(Class),
1852 !,
1853 forall(arg(_, Control, Arg),
1854 assert_new(Src, Origin, Arg)).
1855assert_new(Src, Origin, Term) :-
1856 compound(Term),
1857 arg(1, Term, Prolog),
1858 Prolog == @(prolog),
1859 ( Term =.. [message, _, Selector | T],
1860 atom(Selector)
1861 -> Called =.. [Selector|T],
1862 process_body(Called, Origin, Src)
1863 ; Term =.. [?, _, Selector | T],
1864 atom(Selector)
1865 -> append(T, [_R], T2),
1866 Called =.. [Selector|T2],
1867 process_body(Called, Origin, Src)
1868 ),
1869 fail.
1870assert_new(_, _, @(_)) :- !.
1871assert_new(Src, _, Term) :-
1872 functor_name(Term, Name),
1873 assert_used_class(Src, Name).
1874
1875
1876pce_control_class(and).
1877pce_control_class(or).
1878pce_control_class(if).
1879pce_control_class(not).
1880
1881
1882 1885
1887
1888process_use_module(_Module:_Files, _, _) :- !. 1889process_use_module([], _, _) :- !.
1890process_use_module([H|T], Src, Reexport) :-
1891 !,
1892 process_use_module(H, Src, Reexport),
1893 process_use_module(T, Src, Reexport).
1894process_use_module(library(pce), Src, Reexport) :- 1895 !,
1896 xref_public_list(library(pce), Path, Exports, Src),
1897 forall(member(Import, Exports),
1898 process_pce_import(Import, Src, Path, Reexport)).
1899process_use_module(File, Src, Reexport) :-
1900 load_module_if_needed(File),
1901 ( xoption(Src, silent(Silent))
1902 -> Extra = [silent(Silent)]
1903 ; Extra = [silent(true)]
1904 ),
1905 ( xref_public_list(File, Src,
1906 [ path(Path),
1907 module(M),
1908 exports(Exports),
1909 public(Public),
1910 meta(Meta)
1911 | Extra
1912 ])
1913 -> assert(uses_file(File, Src, Path)),
1914 assert_import(Src, Exports, _, Path, Reexport),
1915 assert_xmodule_callable(Exports, M, Src, Path),
1916 assert_xmodule_callable(Public, M, Src, Path),
1917 maplist(process_meta_head(Src), Meta),
1918 ( File = library(chr) 1919 -> assert(mode(chr, Src))
1920 ; true
1921 )
1922 ; assert(uses_file(File, Src, '<not_found>'))
1923 ).
1924
1925process_pce_import(Name/Arity, Src, Path, Reexport) :-
1926 atom(Name),
1927 integer(Arity),
1928 !,
1929 functor(Term, Name, Arity),
1930 ( \+ system_predicate(Term),
1931 \+ Term = pce_error(_) 1932 -> assert_import(Src, [Name/Arity], _, Path, Reexport)
1933 ; true
1934 ).
1935process_pce_import(op(P,T,N), Src, _, _) :-
1936 xref_push_op(Src, P, T, N).
1937
1941
1942process_use_module2(File, Import, Src, Reexport) :-
1943 load_module_if_needed(File),
1944 ( catch(xref_public_list(File, Src,
1945 [ path(Path),
1946 exports(Export),
1947 meta(Meta)
1948 ]),
1949 error(_,_),
1950 fail)
1951 -> assertz(uses_file(File, Src, Path)),
1952 assert_import(Src, Import, Export, Path, Reexport),
1953 forall(( member(Head, Meta),
1954 imported(Head, _, Path)
1955 ),
1956 process_meta_head(Src, Head))
1957 ; assertz(uses_file(File, Src, '<not_found>'))
1958 ).
1959
1960
1966
1967load_module_if_needed(File) :-
1968 prolog:no_autoload_module(File),
1969 !,
1970 use_module(File, []).
1971load_module_if_needed(_).
1972
1973prolog:no_autoload_module(library(apply_macros)).
1974prolog:no_autoload_module(library(arithmetic)).
1975prolog:no_autoload_module(library(record)).
1976prolog:no_autoload_module(library(persistency)).
1977prolog:no_autoload_module(library(pldoc)).
1978prolog:no_autoload_module(library(settings)).
1979prolog:no_autoload_module(library(debug)).
1980prolog:no_autoload_module(library(plunit)).
1981prolog:no_autoload_module(library(macros)).
1982prolog:no_autoload_module(library(yall)).
1983
1984
1986
1987process_requires(Import, Src) :-
1988 is_list(Import),
1989 !,
1990 require_list(Import, Src).
1991process_requires(Var, _Src) :-
1992 var(Var),
1993 !.
1994process_requires((A,B), Src) :-
1995 !,
1996 process_requires(A, Src),
1997 process_requires(B, Src).
1998process_requires(PI, Src) :-
1999 requires(PI, Src).
2000
2001require_list([], _).
2002require_list([H|T], Src) :-
2003 requires(H, Src),
2004 require_list(T, Src).
2005
2006requires(PI, _Src) :-
2007 '$pi_head'(PI, Head),
2008 '$get_predicate_attribute'(system:Head, defined, 1),
2009 !.
2010requires(PI, Src) :-
2011 '$pi_head'(PI, Head),
2012 '$pi_head'(Name/Arity, Head),
2013 '$find_library'(_Module, Name, Arity, _LoadModule, Library),
2014 ( imported(Head, Src, Library)
2015 -> true
2016 ; assertz(imported(Head, Src, Library))
2017 ).
2018
2019
2052
2053xref_public_list(File, Src, Options) :-
2054 option(path(Source), Options, _),
2055 option(module(Module), Options, _),
2056 option(exports(Exports), Options, _),
2057 option(public(Public), Options, _),
2058 option(meta(Meta), Options, _),
2059 xref_source_file(File, Path, Src, Options),
2060 public_list(Path, Source, Module, Meta, Exports, Public, Options).
2061
2081
2082xref_public_list(File, Source, Export, Src) :-
2083 xref_source_file(File, Path, Src),
2084 public_list(Path, Source, _, _, Export, _, []).
2085xref_public_list(File, Source, Module, Export, Meta, Src) :-
2086 xref_source_file(File, Path, Src),
2087 public_list(Path, Source, Module, Meta, Export, _, []).
2088xref_public_list(File, Source, Module, Export, Public, Meta, Src) :-
2089 xref_source_file(File, Path, Src),
2090 public_list(Path, Source, Module, Meta, Export, Public, []).
2091
2100
2101:- dynamic public_list_cache/7. 2102:- volatile public_list_cache/7. 2103
2104public_list(Path, Source, Module, Meta, Export, Public, _Options) :-
2105 public_list_cache(Path, Source, Modified,
2106 Module0, Meta0, Export0, Public0),
2107 time_file(Path, ModifiedNow),
2108 ( abs(Modified-ModifiedNow) < 0.0001
2109 -> !,
2110 t(Module,Meta,Export,Public) = t(Module0,Meta0,Export0,Public0)
2111 ; retractall(public_list_cache(Path, _, _, _, _, _, _)),
2112 fail
2113 ).
2114public_list(Path, Source, Module, Meta, Export, Public, Options) :-
2115 public_list_nc(Path, Source, Module0, Meta0, Export0, Public0, Options),
2116 ( Error = error(_,_),
2117 catch(time_file(Path, Modified), Error, fail)
2118 -> asserta(public_list_cache(Path, Source, Modified,
2119 Module0, Meta0, Export0, Public0))
2120 ; true
2121 ),
2122 t(Module,Meta,Export,Public) = t(Module0,Meta0,Export0,Public0).
2123
2124public_list_nc(Path, Source, Module, Meta, Export, Public, _Options) :-
2125 public_list_from_index(Path, Module, Meta, Export, Public),
2126 !,
2127 qlf_pl_file(Path, Source).
2128public_list_nc(Path, Source, Module, [], Export, [], _Options) :-
2129 is_qlf_file(Path),
2130 !,
2131 '$qlf_module'(Path, Info),
2132 _{module:Module, exports:Export, file:Source} :< Info.
2133public_list_nc(Path, Path, Module, Meta, Export, Public, Options) :-
2134 exists_file(Path),
2135 !,
2136 prolog_file_directives(Path, Directives, Options),
2137 public_list(Directives, Path, Module, Meta, [], Export, [], Public, []).
2138public_list_nc(Path, Path, Module, [], Export, [], _Options) :-
2139 qlf_pl_file(QlfFile, Path),
2140 '$qlf_module'(QlfFile, Info),
2141 _{module:Module, exports:Export} :< Info.
2142
2143public_list([(:- module(Module, Export0))|Decls], Path,
2144 Module, Meta, MT, Export, Rest, Public, PT) :-
2145 !,
2146 ( is_list(Export0)
2147 -> append(Export0, Reexport, Export)
2148 ; Reexport = Export
2149 ),
2150 public_list_(Decls, Path, Meta, MT, Reexport, Rest, Public, PT).
2151public_list([(:- encoding(_))|Decls], Path,
2152 Module, Meta, MT, Export, Rest, Public, PT) :-
2153 public_list(Decls, Path, Module, Meta, MT, Export, Rest, Public, PT).
2154
2155public_list_([], _, Meta, Meta, Export, Export, Public, Public).
2156public_list_([(:-(Dir))|T], Path, Meta, MT, Export, Rest, Public, PT) :-
2157 public_list_1(Dir, Path, Meta, MT0, Export, Rest0, Public, PT0),
2158 !,
2159 public_list_(T, Path, MT0, MT, Rest0, Rest, PT0, PT).
2160public_list_([_|T], Path, Meta, MT, Export, Rest, Public, PT) :-
2161 public_list_(T, Path, Meta, MT, Export, Rest, Public, PT).
2162
2163public_list_1(reexport(Spec), Path, Meta, MT, Reexport, Rest, Public, PT) :-
2164 reexport_files(Spec, Path, Meta, MT, Reexport, Rest, Public, PT).
2165public_list_1(reexport(Spec, Import), Path, Meta, Meta, Reexport, Rest, Public, Public) :-
2166 public_from_import(Import, Spec, Path, Reexport, Rest).
2167public_list_1(meta_predicate(Decl), _Path, Meta, MT, Export, Export, Public, Public) :-
2168 phrase(meta_decls(Decl), Meta, MT).
2169public_list_1(public(Decl), _Path, Meta, Meta, Export, Export, Public, PT) :-
2170 phrase(public_decls(Decl), Public, PT).
2171
2175
2176reexport_files([], _, Meta, Meta, Export, Export, Public, Public) :- !.
2177reexport_files([H|T], Src, Meta, MT, Export, ET, Public, PT) :-
2178 !,
2179 xref_source_file(H, Path, Src),
2180 public_list(Path, _Source, _Module, Meta0, Export0, Public0, []),
2181 append(Meta0, MT1, Meta),
2182 append(Export0, ET1, Export),
2183 append(Public0, PT1, Public),
2184 reexport_files(T, Src, MT1, MT, ET1, ET, PT1, PT).
2185reexport_files(Spec, Src, Meta, MT, Export, ET, Public, PT) :-
2186 xref_source_file(Spec, Path, Src),
2187 public_list(Path, _Source, _Module, Meta0, Export0, Public0, []),
2188 append(Meta0, MT, Meta),
2189 append(Export0, ET, Export),
2190 append(Public0, PT, Public).
2191
2192public_from_import(except(Map), Path, Src, Export, Rest) :-
2193 !,
2194 xref_public_list(Path, _, AllExports, Src),
2195 except(Map, AllExports, NewExports),
2196 append(NewExports, Rest, Export).
2197public_from_import(Import, _, _, Export, Rest) :-
2198 import_name_map(Import, Export, Rest).
2199
2200
2202
2203except([], Exports, Exports).
2204except([PI0 as NewName|Map], Exports0, Exports) :-
2205 !,
2206 canonical_pi(PI0, PI),
2207 map_as(Exports0, PI, NewName, Exports1),
2208 except(Map, Exports1, Exports).
2209except([PI0|Map], Exports0, Exports) :-
2210 canonical_pi(PI0, PI),
2211 select(PI2, Exports0, Exports1),
2212 same_pi(PI, PI2),
2213 !,
2214 except(Map, Exports1, Exports).
2215
2216
2217map_as([PI|T], Repl, As, [PI2|T]) :-
2218 same_pi(Repl, PI),
2219 !,
2220 pi_as(PI, As, PI2).
2221map_as([H|T0], Repl, As, [H|T]) :-
2222 map_as(T0, Repl, As, T).
2223
2224pi_as(_/Arity, Name, Name/Arity).
2225pi_as(_//Arity, Name, Name//Arity).
2226
2227import_name_map([], L, L).
2228import_name_map([_/Arity as NewName|T0], [NewName/Arity|T], Tail) :-
2229 !,
2230 import_name_map(T0, T, Tail).
2231import_name_map([_//Arity as NewName|T0], [NewName//Arity|T], Tail) :-
2232 !,
2233 import_name_map(T0, T, Tail).
2234import_name_map([H|T0], [H|T], Tail) :-
2235 import_name_map(T0, T, Tail).
2236
2237canonical_pi(Name//Arity0, PI) :-
2238 integer(Arity0),
2239 !,
2240 PI = Name/Arity,
2241 Arity is Arity0 + 2.
2242canonical_pi(PI, PI).
2243
2244same_pi(Canonical, PI2) :-
2245 canonical_pi(PI2, Canonical).
2246
2247meta_decls(Var) -->
2248 { var(Var) },
2249 !.
2250meta_decls((A,B)) -->
2251 !,
2252 meta_decls(A),
2253 meta_decls(B).
2254meta_decls(A) -->
2255 [A].
2256
2257public_decls(Var) -->
2258 { var(Var) },
2259 !.
2260public_decls((A,B)) -->
2261 !,
2262 public_decls(A),
2263 public_decls(B).
2264public_decls(A) -->
2265 [A].
2266
2271
2272public_list_from_index(Path, Module, Meta, Export, Public) :-
2273 file_name_extension(BasePath, _Ext, Path),
2274 file_directory_name(BasePath, Dir),
2275 atom_concat(Dir, '/INDEX.pl', IndexFile),
2276 exists_file(IndexFile),
2277 file_base_name(BasePath, Base),
2278 setup_call_cleanup(
2279 '$push_input_context'(autoload_index),
2280 setup_call_cleanup(
2281 open(IndexFile, read, In),
2282 index_public_list(In, Base, Module, Meta, Export, Public),
2283 close(In)),
2284 '$pop_input_context').
2285
2286index_public_list(In, Base, Module, Meta, Export, Public) :-
2287 read_term(In, Term, []),
2288 index_public_list(Term, In, Base, Module, Meta, Export, Public).
2289
2290index_public_list(end_of_file, _In, _Base, _Module, [], [], []).
2291index_public_list(index(op:Op, Module, Base), In, Base, Module, Meta, [Op|Export], Public) :-
2292 !,
2293 read_term(In, Term, []),
2294 index_public_list(Term, In, Base, Module, Meta, Export, Public).
2295index_public_list(index((public):Head, Module, Base), In, Base, Module, Meta, Export, [PI|Public]) :-
2296 !,
2297 pi_head(PI, Head),
2298 read_term(In, Term, []),
2299 index_public_list(Term, In, Base, Module, Meta, Export, Public).
2300index_public_list(index(Head, Module, Base), In, Base, Module, Meta, [PI|Export], Public) :-
2301 !,
2302 pi_head(PI, Head),
2303 ( meta_mode(Head)
2304 -> Meta = [Head|MetaT]
2305 ; Meta = MetaT
2306 ),
2307 read_term(In, Term, []),
2308 index_public_list(Term, In, Base, Module, MetaT, Export, Public).
2309index_public_list(index(Name, Arity, Module, Base), In, Base, Module, Meta, [Name/Arity|Export], Public) :-
2310 !,
2311 read_term(In, Term, []),
2312 index_public_list(Term, In, Base, Module, Meta, Export, Public).
2313index_public_list(_, In, Base, Module, Meta, Export, Public) :-
2314 read_term(In, Term, []),
2315 index_public_list(Term, In, Base, Module, Meta, Export, Public).
2316
2317meta_mode(H) :-
2318 compound(H),
2319 arg(_, H, A),
2320 meta_arg(A),
2321 !.
2322
2323meta_arg(I) :-
2324 integer(I),
2325 !.
2326meta_arg(:).
2327meta_arg(^).
2328meta_arg(//).
2329
2330 2333
2334process_include([], _) :- !.
2335process_include([H|T], Src) :-
2336 !,
2337 process_include(H, Src),
2338 process_include(T, Src).
2339process_include(File, Src) :-
2340 callable(File),
2341 !,
2342 ( once(xref_input(ParentSrc, _)),
2343 xref_source_file(File, Path, ParentSrc)
2344 -> ( ( uses_file(_, Src, Path)
2345 ; Path == Src
2346 )
2347 -> true
2348 ; assert(uses_file(File, Src, Path)),
2349 ( xoption(Src, process_include(true))
2350 -> findall(O, xoption(Src, O), Options),
2351 setup_call_cleanup(
2352 open_include_file(Path, In, Refs),
2353 collect(Src, Path, In, Options),
2354 close_include(In, Refs))
2355 ; true
2356 )
2357 )
2358 ; assert(uses_file(File, Src, '<not_found>'))
2359 ).
2360process_include(_, _).
2361
2367
2368open_include_file(Path, In, [Ref]) :-
2369 once(xref_input(_, Parent)),
2370 stream_property(Parent, encoding(Enc)),
2371 '$push_input_context'(xref_include),
2372 catch(( prolog:xref_open_source(Path, In)
2373 -> catch(set_stream(In, encoding(Enc)),
2374 error(_,_), true) 2375 ; include_encoding(Enc, Options),
2376 open(Path, read, In, Options)
2377 ), E,
2378 ( '$pop_input_context', throw(E))),
2379 catch(( peek_char(In, #) 2380 -> skip(In, 10)
2381 ; true
2382 ), E,
2383 ( close_include(In, []), throw(E))),
2384 asserta(xref_input(Path, In), Ref).
2385
2386include_encoding(wchar_t, []) :- !.
2387include_encoding(Enc, [encoding(Enc)]).
2388
2389
2390close_include(In, Refs) :-
2391 maplist(erase, Refs),
2392 close(In, [force(true)]),
2393 '$pop_input_context'.
2394
2398
2399process_foreign(Spec, Src) :-
2400 ground(Spec),
2401 current_foreign_library(Spec, Defined),
2402 !,
2403 ( xmodule(Module, Src)
2404 -> true
2405 ; Module = user
2406 ),
2407 process_foreign_defined(Defined, Module, Src).
2408process_foreign(_, _).
2409
2410process_foreign_defined([], _, _).
2411process_foreign_defined([H|T], M, Src) :-
2412 ( H = M:Head
2413 -> assert_foreign(Src, Head)
2414 ; assert_foreign(Src, H)
2415 ),
2416 process_foreign_defined(T, M, Src).
2417
2418
2419 2422
2432
2433process_chr(@(_Name, Rule), Src) :-
2434 mode(chr, Src),
2435 process_chr(Rule, Src).
2436process_chr(pragma(Rule, _Pragma), Src) :-
2437 mode(chr, Src),
2438 process_chr(Rule, Src).
2439process_chr(<=>(Head, Body), Src) :-
2440 mode(chr, Src),
2441 chr_head(Head, Src, H),
2442 chr_body(Body, H, Src).
2443process_chr(==>(Head, Body), Src) :-
2444 mode(chr, Src),
2445 chr_head(Head, H, Src),
2446 chr_body(Body, H, Src).
2447process_chr((:- chr_constraint(Decls)), Src) :-
2448 ( mode(chr, Src)
2449 -> true
2450 ; assert(mode(chr, Src))
2451 ),
2452 chr_decls(Decls, Src).
2453
2454chr_decls((A,B), Src) =>
2455 chr_decls(A, Src),
2456 chr_decls(B, Src).
2457chr_decls(Head, Src) =>
2458 generalise_term(Head, Gen),
2459 ( declared(Gen, chr_constraint, Src, _)
2460 -> true
2461 ; current_source_line(Line),
2462 assertz(declared(Gen, chr_constraint, Src, Line))
2463 ).
2464
2465chr_head(X, _, _) :-
2466 var(X),
2467 !. 2468chr_head(\(A,B), Src, H) :-
2469 chr_head(A, Src, H),
2470 process_body(B, H, Src).
2471chr_head((H0,B), Src, H) :-
2472 chr_defined(H0, Src, H),
2473 process_body(B, H, Src).
2474chr_head(H0, Src, H) :-
2475 chr_defined(H0, Src, H).
2476
2477chr_defined(X, _, _) :-
2478 var(X),
2479 !.
2480chr_defined(#(C,_Id), Src, C) :-
2481 !,
2482 assert_constraint(Src, C).
2483chr_defined(A, Src, A) :-
2484 assert_constraint(Src, A).
2485
2486chr_body(X, From, Src) :-
2487 var(X),
2488 !,
2489 process_body(X, From, Src).
2490chr_body('|'(Guard, Goals), H, Src) :-
2491 !,
2492 chr_body(Guard, H, Src),
2493 chr_body(Goals, H, Src).
2494chr_body(G, From, Src) :-
2495 process_body(G, From, Src).
2496
2497assert_constraint(_, Head) :-
2498 var(Head),
2499 !.
2500assert_constraint(Src, Head) :-
2501 constraint(Head, Src, _),
2502 !.
2503assert_constraint(Src, Head) :-
2504 generalise_term(Head, Term),
2505 current_source_line(Line),
2506 assert(constraint(Term, Src, Line)).
2507
2508
2509 2512
2517
2518assert_called(_, _, Var, _) :-
2519 var(Var),
2520 !.
2521assert_called(Src, From, Goal, Line) :-
2522 var(From),
2523 !,
2524 assert_called(Src, '<unknown>', Goal, Line).
2525assert_called(_, _, Goal, _) :-
2526 expand_hide_called(Goal),
2527 !.
2528assert_called(Src, Origin, M:G, Line) :-
2529 !,
2530 ( atom(M),
2531 callable(G)
2532 -> current_condition(Cond),
2533 ( xmodule(M, Src) 2534 -> assert_called(Src, Origin, G, Line)
2535 ; called(M:G, Src, Origin, Cond, Line) 2536 -> true
2537 ; hide_called(M:G, Src) 2538 -> true
2539 ; generalise(Origin, OTerm),
2540 generalise(G, GTerm)
2541 -> assert(called(M:GTerm, Src, OTerm, Cond, Line))
2542 ; true
2543 )
2544 ; true 2545 ).
2546assert_called(Src, _, Goal, _) :-
2547 ( xmodule(M, Src)
2548 -> M \== system
2549 ; M = user
2550 ),
2551 hide_called(M:Goal, Src),
2552 !.
2553assert_called(Src, Origin, Goal, Line) :-
2554 current_condition(Cond),
2555 ( called(Goal, Src, Origin, Cond, Line)
2556 -> true
2557 ; generalise(Origin, OTerm),
2558 generalise(Goal, Term)
2559 -> assert(called(Term, Src, OTerm, Cond, Line))
2560 ; true
2561 ).
2562
2563
2568
2569expand_hide_called(pce_principal:send_implementation(_, _, _)).
2570expand_hide_called(pce_principal:get_implementation(_, _, _, _)).
2571expand_hide_called(pce_principal:pce_lazy_get_method(_,_,_)).
2572expand_hide_called(pce_principal:pce_lazy_send_method(_,_,_)).
2573
2574assert_defined(Src, Goal) :-
2575 Goal = test(_Test),
2576 current_test_unit(Unit, Line),
2577 assert_called(Src, '<test_unit>'(Unit), Goal, Line),
2578 fail.
2579assert_defined(Src, Goal) :-
2580 Goal = test(_Test, _Options),
2581 current_test_unit(Unit, Line),
2582 assert_called(Src, '<test_unit>'(Unit), Goal, Line),
2583 fail.
2584assert_defined(Src, Goal) :-
2585 defined(Goal, Src, _),
2586 !.
2587assert_defined(Src, Goal) :-
2588 generalise(Goal, Term),
2589 current_source_line(Line),
2590 assert(defined(Term, Src, Line)).
2591
2592assert_foreign(Src, Goal) :-
2593 foreign(Goal, Src, _),
2594 !.
2595assert_foreign(Src, Goal) :-
2596 generalise(Goal, Term),
2597 current_source_line(Line),
2598 assert(foreign(Term, Src, Line)).
2599
2600assert_grammar_rule(Src, Goal) :-
2601 grammar_rule(Goal, Src),
2602 !.
2603assert_grammar_rule(Src, Goal) :-
2604 generalise(Goal, Term),
2605 assert(grammar_rule(Term, Src)).
2606
2607
2617
2618assert_import(_, [], _, _, _) :- !.
2619assert_import(Src, [H|T], Export, From, Reexport) :-
2620 !,
2621 assert_import(Src, H, Export, From, Reexport),
2622 assert_import(Src, T, Export, From, Reexport).
2623assert_import(Src, except(Except), Export, From, Reexport) :-
2624 !,
2625 is_list(Export),
2626 !,
2627 except(Except, Export, Import),
2628 assert_import(Src, Import, _All, From, Reexport).
2629assert_import(Src, Import as Name, Export, From, Reexport) :-
2630 !,
2631 pi_to_head(Import, Term0),
2632 rename_goal(Term0, Name, Term),
2633 ( in_export_list(Term0, Export)
2634 -> assert(imported(Term, Src, From)),
2635 assert_reexport(Reexport, Src, Term)
2636 ; current_source_line(Line),
2637 assert_called(Src, '<directive>'(Line), Term0, Line)
2638 ).
2639assert_import(Src, Import, Export, From, Reexport) :-
2640 pi_to_head(Import, Term),
2641 !,
2642 ( in_export_list(Term, Export)
2643 -> assert(imported(Term, Src, From)),
2644 assert_reexport(Reexport, Src, Term)
2645 ; current_source_line(Line),
2646 assert_called(Src, '<directive>'(Line), Term, Line)
2647 ).
2648assert_import(Src, op(P,T,N), _, _, _) :-
2649 xref_push_op(Src, P,T,N).
2650
2651in_export_list(_Head, Export) :-
2652 var(Export),
2653 !.
2654in_export_list(Head, Export) :-
2655 member(PI, Export),
2656 pi_to_head(PI, Head).
2657
2658assert_reexport(false, _, _) :- !.
2659assert_reexport(true, Src, Term) :-
2660 assert(exported(Term, Src)).
2661
2665
2666process_import(M:PI, Src) :-
2667 pi_to_head(PI, Head),
2668 !,
2669 ( atom(M),
2670 current_module(M),
2671 module_property(M, file(From))
2672 -> true
2673 ; From = '<unknown>'
2674 ),
2675 assert(imported(Head, Src, From)).
2676process_import(_, _).
2677
2684
2685assert_xmodule_callable([], _, _, _).
2686assert_xmodule_callable([PI|T], M, Src, From) :-
2687 ( pi_to_head(M:PI, Head)
2688 -> assert(imported(Head, Src, From))
2689 ; true
2690 ),
2691 assert_xmodule_callable(T, M, Src, From).
2692
2693
2697
2698assert_op(Src, op(P,T,M:N)) :-
2699 ( '$current_source_module'(M)
2700 -> Name = N
2701 ; Name = M:N
2702 ),
2703 ( xop(Src, op(P,T,Name))
2704 -> true
2705 ; assert(xop(Src, op(P,T,Name)))
2706 ).
2707
2712
2713assert_module(Src, Module) :-
2714 xmodule(Module, Src),
2715 !.
2716assert_module(Src, Module) :-
2717 '$set_source_module'(Module),
2718 assert(xmodule(Module, Src)),
2719 ( module_property(Module, class(system))
2720 -> retractall(xoption(Src, register_called(_))),
2721 assert(xoption(Src, register_called(all)))
2722 ; true
2723 ).
2724
2725assert_module_export(_, []) :- !.
2726assert_module_export(Src, [H|T]) :-
2727 !,
2728 assert_module_export(Src, H),
2729 assert_module_export(Src, T).
2730assert_module_export(Src, PI) :-
2731 pi_to_head(PI, Term),
2732 !,
2733 assert(exported(Term, Src)).
2734assert_module_export(Src, op(P, A, N)) :-
2735 xref_push_op(Src, P, A, N).
2736
2740
2741assert_module3([], _) :- !.
2742assert_module3([H|T], Src) :-
2743 !,
2744 assert_module3(H, Src),
2745 assert_module3(T, Src).
2746assert_module3(Option, Src) :-
2747 process_use_module(library(dialect/Option), Src, false).
2748
2749
2755
2756process_predicates(Closure, Preds, Src) :-
2757 is_list(Preds),
2758 !,
2759 process_predicate_list(Preds, Closure, Src).
2760process_predicates(Closure, as(Preds, _Options), Src) :-
2761 !,
2762 process_predicates(Closure, Preds, Src).
2763process_predicates(Closure, Preds, Src) :-
2764 process_predicate_comma(Preds, Closure, Src).
2765
2766process_predicate_list([], _, _).
2767process_predicate_list([H|T], Closure, Src) :-
2768 ( nonvar(H)
2769 -> call(Closure, H, Src)
2770 ; true
2771 ),
2772 process_predicate_list(T, Closure, Src).
2773
2774process_predicate_comma(Var, _, _) :-
2775 var(Var),
2776 !.
2777process_predicate_comma(M:(A,B), Closure, Src) :-
2778 !,
2779 process_predicate_comma(M:A, Closure, Src),
2780 process_predicate_comma(M:B, Closure, Src).
2781process_predicate_comma((A,B), Closure, Src) :-
2782 !,
2783 process_predicate_comma(A, Closure, Src),
2784 process_predicate_comma(B, Closure, Src).
2785process_predicate_comma(as(Spec, _Options), Closure, Src) :-
2786 !,
2787 process_predicate_comma(Spec, Closure, Src).
2788process_predicate_comma(A, Closure, Src) :-
2789 call(Closure, A, Src).
2790
2791
2792assert_dynamic(PI, Src) :-
2793 pi_to_head(PI, Term),
2794 ( thread_local(Term, Src, _) 2795 -> true 2796 ; current_source_line(Line),
2797 assert(dynamic(Term, Src, Line))
2798 ).
2799
2800assert_thread_local(PI, Src) :-
2801 pi_to_head(PI, Term),
2802 current_source_line(Line),
2803 assert(thread_local(Term, Src, Line)).
2804
2805assert_multifile(PI, Src) :- 2806 pi_to_head(PI, Term),
2807 current_source_line(Line),
2808 assert(multifile(Term, Src, Line)).
2809
2810assert_public(PI, Src) :- 2811 pi_to_head(PI, Term),
2812 current_source_line(Line),
2813 assert_called(Src, '<public>'(Line), Term, Line),
2814 assert(public(Term, Src, Line)).
2815
2816assert_export(PI, Src) :- 2817 pi_to_head(PI, Term),
2818 !,
2819 assert(exported(Term, Src)).
2820
2825
2826pi_to_head(Var, _) :-
2827 var(Var), !, fail.
2828pi_to_head(M:PI, M:Term) :-
2829 !,
2830 pi_to_head(PI, Term).
2831pi_to_head(Name/Arity, Term) :-
2832 functor(Term, Name, Arity).
2833pi_to_head(Name//DCGArity, Term) :-
2834 Arity is DCGArity+2,
2835 functor(Term, Name, Arity).
2836
2837
2838assert_used_class(Src, Name) :-
2839 used_class(Name, Src),
2840 !.
2841assert_used_class(Src, Name) :-
2842 assert(used_class(Name, Src)).
2843
2844assert_defined_class(Src, Name, _Meta, _Super, _) :-
2845 defined_class(Name, _, _, Src, _),
2846 !.
2847assert_defined_class(_, _, _, -, _) :- !. 2848assert_defined_class(Src, Name, Meta, Super, Summary) :-
2849 current_source_line(Line),
2850 ( Summary == @(default)
2851 -> Atom = ''
2852 ; is_list(Summary)
2853 -> atom_codes(Atom, Summary)
2854 ; string(Summary)
2855 -> atom_concat(Summary, '', Atom)
2856 ),
2857 assert(defined_class(Name, Super, Atom, Src, Line)),
2858 ( Meta = @(_)
2859 -> true
2860 ; assert_used_class(Src, Meta)
2861 ),
2862 assert_used_class(Src, Super).
2863
2864assert_defined_class(Src, Name, imported_from(_File)) :-
2865 defined_class(Name, _, _, Src, _),
2866 !.
2867assert_defined_class(Src, Name, imported_from(File)) :-
2868 assert(defined_class(Name, _, '', Src, file(File))).
2869
2870
2871 2874
2878
2879generalise(Var, Var) :-
2880 var(Var),
2881 !. 2882generalise(pce_principal:send_implementation(Id, _, _),
2883 pce_principal:send_implementation(Id, _, _)) :-
2884 atom(Id),
2885 !.
2886generalise(pce_principal:get_implementation(Id, _, _, _),
2887 pce_principal:get_implementation(Id, _, _, _)) :-
2888 atom(Id),
2889 !.
2890generalise('<directive>'(Line), '<directive>'(Line)) :- !.
2891generalise(test(Test), test(Test)) :-
2892 current_test_unit(_,_),
2893 ground(Test),
2894 !.
2895generalise(test(Test, _), test(Test, _)) :-
2896 current_test_unit(_,_),
2897 ground(Test),
2898 !.
2899generalise('<test_unit>'(Line), '<test_unit>'(Line)) :- !.
2900generalise(Module:Goal0, Module:Goal) :-
2901 atom(Module),
2902 !,
2903 generalise(Goal0, Goal).
2904generalise(Term0, Term) :-
2905 callable(Term0),
2906 generalise_term(Term0, Term).
2907
2908
2909 2912
2920
2921:- multifile
2922 prolog:xref_source_directory/2, 2923 prolog:xref_source_file/3. 2924
2925
2930
2931xref_source_file(Plain, File, Source) :-
2932 xref_source_file(Plain, File, Source, []).
2933
2934xref_source_file(QSpec, File, Source, Options) :-
2935 nonvar(QSpec), QSpec = _:Spec,
2936 !,
2937 must_be(acyclic, Spec),
2938 xref_source_file(Spec, File, Source, Options).
2939xref_source_file(Spec, File, Source, Options) :-
2940 nonvar(Spec),
2941 prolog:xref_source_file(Spec, File,
2942 [ relative_to(Source)
2943 | Options
2944 ]),
2945 !.
2946xref_source_file(Plain, File, Source, Options) :-
2947 atom(Plain),
2948 \+ is_absolute_file_name(Plain),
2949 ( prolog:xref_source_directory(Source, Dir)
2950 -> true
2951 ; atom(Source),
2952 file_directory_name(Source, Dir)
2953 ),
2954 atomic_list_concat([Dir, /, Plain], Spec0),
2955 absolute_file_name(Spec0, Spec),
2956 do_xref_source_file(Spec, File, Options),
2957 !.
2958xref_source_file(Spec, File, Source, Options) :-
2959 do_xref_source_file(Spec, File,
2960 [ relative_to(Source)
2961 | Options
2962 ]),
2963 !.
2964xref_source_file(_, _, _, Options) :-
2965 option(silent(true), Options),
2966 !,
2967 fail.
2968xref_source_file(Spec, _, Src, _Options) :-
2969 verbose(Src),
2970 print_message(warning, error(existence_error(file, Spec), _)),
2971 fail.
2972
2973do_xref_source_file(Spec, File, Options) :-
2974 nonvar(Spec),
2975 option(file_type(Type), Options, prolog),
2976 absolute_file_name(Spec, File0,
2977 [ file_type(Type),
2978 access(read),
2979 file_errors(fail)
2980 ]),
2981 !,
2982 qlf_pl_file(File0, File).
2983do_xref_source_file(Spec, File, Options) :-
2984 atom(Spec), 2985 file_name_extension(Base, Ext, Spec),
2986 user:prolog_file_type(Ext, source),
2987 option(file_type(prolog), Options, prolog),
2988 absolute_file_name(Base, File0,
2989 [ file_type(prolog),
2990 access(read),
2991 file_errors(fail)
2992 ]),
2993 qlf_pl_file(File0, File).
2994
2996
2997qlf_pl_file(QlfFile, PlFile) :-
2998 nonvar(QlfFile),
2999 is_qlf_file(QlfFile),
3000 !,
3001 '$qlf_module'(QlfFile, Info),
3002 #{file:PlFile} :< Info.
3003qlf_pl_file(QlfFile, PlFile) :-
3004 nonvar(PlFile),
3005 !,
3006 ( file_name_extension(Base, Ext, PlFile),
3007 user:prolog_file_type(Ext, source)
3008 -> true
3009 ),
3010 ( user:prolog_file_type(QlfExt, qlf),
3011 file_name_extension(Base, QlfExt, QlfFile),
3012 exists_file(QlfFile)
3013 -> true
3014 ),
3015 '$qlf_module'(QlfFile, Info),
3016 #{file:PlFile} :< Info,
3017 !.
3018qlf_pl_file(PlFile, PlFile).
3019
3020is_qlf_file(QlfFile) :-
3021 file_name_extension(_, Ext, QlfFile),
3022 user:prolog_file_type(Ext, qlf),
3023 !.
3024
3028
3029canonical_source(Source, Src) :-
3030 ( ground(Source)
3031 -> prolog_canonical_source(Source, Src)
3032 ; Source = Src
3033 ).
3034
3039
3040goal_name_arity(Goal, Name, Arity) :-
3041 ( compound(Goal)
3042 -> compound_name_arity(Goal, Name, Arity)
3043 ; atom(Goal)
3044 -> Name = Goal, Arity = 0
3045 ).
3046
3047generalise_term(Specific, General) :-
3048 ( compound(Specific)
3049 -> compound_name_arity(Specific, Name, Arity),
3050 compound_name_arity(General, Name, Arity)
3051 ; General = Specific
3052 ).
3053
3054functor_name(Term, Name) :-
3055 ( compound(Term)
3056 -> compound_name_arity(Term, Name, _)
3057 ; atom(Term)
3058 -> Name = Term
3059 ).
3060
3061rename_goal(Goal0, Name, Goal) :-
3062 ( compound(Goal0)
3063 -> compound_name_arity(Goal0, _, Arity),
3064 compound_name_arity(Goal, Name, Arity)
3065 ; Goal = Name
3066 )