37
38:- module('$syspreds',
39 [ leash/1,
40 visible/1,
41 style_check/1,
42 flag/3,
43 atom_prefix/2,
44 dwim_match/2,
45 source_file_property/2,
46 source_file/1,
47 source_file/2,
48 unload_file/1,
49 exists_source/1, 50 exists_source/2, 51 prolog_load_context/2,
52 stream_position_data/3,
53 current_predicate/2,
54 '$defined_predicate'/1,
55 predicate_property/2,
56 '$predicate_property'/2,
57 (dynamic)/2, 58 clause_property/2,
59 current_module/1, 60 module_property/2, 61 module/1, 62 current_trie/1, 63 trie_property/2, 64 working_directory/2, 65 shell/1, 66 on_signal/3,
67 current_signal/3,
68 format/1,
69 garbage_collect/0,
70 set_prolog_stack/2,
71 prolog_stack_property/2,
72 absolute_file_name/2,
73 tmp_file_stream/3, 74 call_with_depth_limit/3, 75 call_with_inference_limit/3, 76 rule/2, 77 rule/3, 78 numbervars/3, 79 term_string/3, 80 nb_setval/2, 81 thread_create/2, 82 thread_join/1, 83 sig_block/1, 84 sig_unblock/1, 85 transaction/1, 86 transaction/2, 87 transaction/3, 88 snapshot/1, 89 undo/1, 90 set_prolog_gc_thread/1, 91
92 '$wrap_predicate'/5 93 ]). 94
95:- meta_predicate
96 dynamic(:, +),
97 transaction(0),
98 transaction(0,0,+),
99 snapshot(0),
100 rule(:, -),
101 rule(:, -, ?),
102 sig_block(:),
103 sig_unblock(:). 104
105
106 109
111
112:- meta_predicate
113 map_bits(2, +, +, -). 114
115map_bits(_, Var, _, _) :-
116 var(Var),
117 !,
118 '$instantiation_error'(Var).
119map_bits(_, [], Bits, Bits) :- !.
120map_bits(Pred, [H|T], Old, New) :-
121 map_bits(Pred, H, Old, New0),
122 map_bits(Pred, T, New0, New).
123map_bits(Pred, +Name, Old, New) :- 124 !,
125 bit(Pred, Name, Bits),
126 !,
127 New is Old \/ Bits.
128map_bits(Pred, -Name, Old, New) :- 129 !,
130 bit(Pred, Name, Bits),
131 !,
132 New is Old /\ (\Bits).
133map_bits(Pred, ?(Name), Old, Old) :- 134 !,
135 bit(Pred, Name, Bits),
136 Old /\ Bits > 0.
137map_bits(_, Term, _, _) :-
138 '$type_error'('+|-|?(Flag)', Term).
139
140bit(Pred, Name, Bits) :-
141 call(Pred, Name, Bits),
142 !.
143bit(_:Pred, Name, _) :-
144 '$domain_error'(Pred, Name).
145
146:- public port_name/2. 147
148port_name( call, 2'000000001).
149port_name( exit, 2'000000010).
150port_name( fail, 2'000000100).
151port_name( redo, 2'000001000).
152port_name( unify, 2'000010000).
153port_name( break, 2'000100000).
154port_name( cut_call, 2'001000000).
155port_name( cut_exit, 2'010000000).
156port_name( exception, 2'100000000).
157port_name( cut, 2'011000000).
158port_name( all, 2'000111111).
159port_name( full, 2'000101111).
160port_name( half, 2'000101101). 161
162leash(Ports) :-
163 '$leash'(Old, Old),
164 map_bits(port_name, Ports, Old, New),
165 '$leash'(_, New).
166
167visible(Ports) :-
168 '$visible'(Old, Old),
169 map_bits(port_name, Ports, Old, New),
170 '$visible'(_, New).
171
172style_name(atom, 0x0001) :-
173 print_message(warning, decl_no_effect(style_check(atom))).
174style_name(singleton, 0x0042). 175style_name(discontiguous, 0x0008).
176style_name(charset, 0x0020).
177style_name(no_effect, 0x0080).
178style_name(var_branches, 0x0100).
179
181
182style_check(Var) :-
183 var(Var),
184 !,
185 '$instantiation_error'(Var).
186style_check(?(Style)) :-
187 !,
188 ( var(Style)
189 -> enum_style_check(Style)
190 ; enum_style_check(Style)
191 -> true
192 ).
193style_check(Spec) :-
194 '$style_check'(Old, Old),
195 map_bits(style_name, Spec, Old, New),
196 '$style_check'(_, New).
197
198enum_style_check(Style) :-
199 '$style_check'(Bits, Bits),
200 style_name(Style, Bit),
201 Bit /\ Bits =\= 0.
202
203
208
209flag(Name, Old, New) :-
210 Old == New,
211 !,
212 get_flag(Name, Old).
213flag(Name, Old, New) :-
214 with_mutex('$flag', update_flag(Name, Old, New)).
215
216update_flag(Name, Old, New) :-
217 get_flag(Name, Old),
218 ( atom(New)
219 -> set_flag(Name, New)
220 ; Value is New,
221 set_flag(Name, Value)
222 ).
223
224
225 228
229dwim_match(A1, A2) :-
230 dwim_match(A1, A2, _).
231
232atom_prefix(Atom, Prefix) :-
233 sub_atom(Atom, 0, _, _, Prefix).
234
235
236 239
250
251source_file(File) :-
252 ( current_prolog_flag(access_level, user)
253 -> Level = user
254 ; true
255 ),
256 ( ground(File)
257 -> ( '$time_source_file'(File, Time, Level)
258 ; absolute_file_name(File, Abs),
259 '$time_source_file'(Abs, Time, Level)
260 ), !
261 ; '$time_source_file'(File, Time, Level)
262 ),
263 float(Time).
264
269
270:- meta_predicate source_file(:, ?). 271
272source_file(M:Head, File) :-
273 nonvar(M), nonvar(Head),
274 !,
275 ( '$c_current_predicate'(_, M:Head),
276 predicate_property(M:Head, multifile)
277 -> multi_source_file(M:Head, File)
278 ; '$source_file'(M:Head, File)
279 ).
280source_file(M:Head, File) :-
281 ( nonvar(File)
282 -> true
283 ; source_file(File)
284 ),
285 '$source_file_predicates'(File, Predicates),
286 '$member'(M:Head, Predicates).
287
288multi_source_file(Head, File) :-
289 State = state([]),
290 nth_clause(Head, _, Clause),
291 clause_property(Clause, source(File)),
292 arg(1, State, Found),
293 ( memberchk(File, Found)
294 -> fail
295 ; nb_linkarg(1, State, [File|Found])
296 ).
297
298
302
303source_file_property(File, P) :-
304 nonvar(File),
305 !,
306 canonical_source_file(File, Path),
307 property_source_file(P, Path).
308source_file_property(File, P) :-
309 property_source_file(P, File).
310
311property_source_file(modified(Time), File) :-
312 '$time_source_file'(File, Time, user).
313property_source_file(source(Source), File) :-
314 ( '$source_file_property'(File, from_state, true)
315 -> Source = state
316 ; '$source_file_property'(File, resource, true)
317 -> Source = resource
318 ; Source = file
319 ).
320property_source_file(module(M), File) :-
321 ( nonvar(M)
322 -> '$current_module'(M, File)
323 ; nonvar(File)
324 -> '$current_module'(ML, File),
325 ( atom(ML)
326 -> M = ML
327 ; '$member'(M, ML)
328 )
329 ; '$current_module'(M, File)
330 ).
331property_source_file(load_context(Module, Location, Options), File) :-
332 '$time_source_file'(File, _, user),
333 clause(system:'$load_context_module'(File, Module, Options), true, Ref),
334 ( clause_property(Ref, file(FromFile)),
335 clause_property(Ref, line_count(FromLine))
336 -> Location = FromFile:FromLine
337 ; Location = user
338 ).
339property_source_file(includes(Master, Stamp), File) :-
340 system:'$included'(File, _Line, Master, Stamp).
341property_source_file(included_in(Master, Line), File) :-
342 system:'$included'(Master, Line, File, _).
343property_source_file(derived_from(DerivedFrom, Stamp), File) :-
344 system:'$derived_source'(File, DerivedFrom, Stamp).
345property_source_file(reloading, File) :-
346 source_file(File),
347 '$source_file_property'(File, reloading, true).
348property_source_file(load_count(Count), File) :-
349 source_file(File),
350 '$source_file_property'(File, load_count, Count).
351property_source_file(number_of_clauses(Count), File) :-
352 source_file(File),
353 '$source_file_property'(File, number_of_clauses, Count).
354
355
359
360canonical_source_file(Spec, File) :-
361 atom(Spec),
362 '$time_source_file'(Spec, _, _),
363 !,
364 File = Spec.
365canonical_source_file(Spec, File) :-
366 system:'$included'(_Master, _Line, Spec, _),
367 !,
368 File = Spec.
369canonical_source_file(Spec, File) :-
370 absolute_file_name(Spec, File,
371 [ file_type(prolog),
372 access(read),
373 file_errors(fail)
374 ]),
375 source_file(File).
376
377
391
392exists_source(Source) :-
393 exists_source(Source, _Path).
394
395exists_source(Source, Path) :-
396 absolute_file_name(Source, Path,
397 [ file_type(prolog),
398 access(read),
399 file_errors(fail)
400 ]).
401
402
408
409prolog_load_context(module, Module) :-
410 '$current_source_module'(Module).
411prolog_load_context(file, File) :-
412 input_file(File).
413prolog_load_context(source, F) :- 414 input_file(F0),
415 '$input_context'(Context),
416 '$top_file'(Context, F0, F).
417prolog_load_context(stream, S) :-
418 ( system:'$load_input'(_, S0)
419 -> S = S0
420 ).
421prolog_load_context(directory, D) :-
422 input_file(F),
423 file_directory_name(F, D).
424prolog_load_context(dialect, D) :-
425 current_prolog_flag(emulated_dialect, D).
426prolog_load_context(term_position, TermPos) :-
427 source_location(_, L),
428 ( nb_current('$term_position', Pos),
429 compound(Pos), 430 stream_position_data(line_count, Pos, L)
431 -> TermPos = Pos
432 ; TermPos = '$stream_position'(0,L,0,0)
433 ).
434prolog_load_context(script, Bool) :-
435 ( '$toplevel':loaded_init_file(script, Path),
436 input_file(File),
437 same_file(File, Path)
438 -> Bool = true
439 ; Bool = false
440 ).
441prolog_load_context(variable_names, Bindings) :-
442 ( nb_current('$variable_names', Bindings0)
443 -> Bindings = Bindings0
444 ; Bindings = []
445 ).
446prolog_load_context(term, Term) :-
447 nb_current('$term', Term).
448prolog_load_context(reloading, true) :-
449 prolog_load_context(source, F),
450 '$source_file_property'(F, reloading, true).
451
452input_file(File) :-
453 ( system:'$load_input'(_, Stream)
454 -> stream_property(Stream, file_name(File))
455 ),
456 !.
457input_file(File) :-
458 source_location(File, _).
459
460
464
465:- dynamic system:'$resolved_source_path'/2. 466
467unload_file(File) :-
468 ( canonical_source_file(File, Path)
469 -> '$unload_file'(Path),
470 retractall(system:'$resolved_source_path'(_, Path))
471 ; true
472 ).
473
474:- if(current_prolog_flag(open_shared_object, true)). 475
476 479
496
497:- meta_predicate
498 use_foreign_library(:),
499 use_foreign_library(:, +). 500:- public
501 use_foreign_library_noi/1. 502
503use_foreign_library(FileSpec) :-
504 ensure_shlib,
505 initialization(use_foreign_library_noi(FileSpec), now).
506
508use_foreign_library_noi(FileSpec) :-
509 ensure_shlib,
510 shlib:load_foreign_library(FileSpec).
511
512use_foreign_library(FileSpec, Options) :-
513 ensure_shlib,
514 initialization(shlib:load_foreign_library(FileSpec, Options), now).
515
516ensure_shlib :-
517 '$get_predicate_attribute'(shlib:load_foreign_library(_), defined, 1),
518 '$get_predicate_attribute'(shlib:load_foreign_library(_,_), defined, 1),
519 !.
520ensure_shlib :-
521 use_module(library(shlib), []).
522
523:- export(use_foreign_library/1). 524:- export(use_foreign_library/2). 525
526:- elif(current_predicate('$activate_static_extension'/1)). 527
530
531:- meta_predicate
532 use_foreign_library(:). 533:- public
534 use_foreign_library_noi/1. 535:- dynamic
536 loading/1,
537 foreign_predicate/2. 538
539use_foreign_library(FileSpec) :-
540 initialization(use_foreign_library_noi(FileSpec), now).
541
542use_foreign_library_noi(Module:foreign(Extension)) :-
543 setup_call_cleanup(
544 asserta(loading(foreign(Extension)), Ref),
545 @('$activate_static_extension'(Extension), Module),
546 erase(Ref)).
547
548:- export(use_foreign_library/1). 549
550system:'$foreign_registered'(M, H) :-
551 ( loading(Lib)
552 -> true
553 ; Lib = '<spontaneous>'
554 ),
555 assert(foreign_predicate(Lib, M:H)).
556
560
561current_foreign_library(File, Public) :-
562 setof(Pred, foreign_predicate(File, Pred), Public).
563
564:- export(current_foreign_library/2). 565
566:- endif. 567
568 571
576
577stream_position_data(Prop, Term, Value) :-
578 nonvar(Prop),
579 !,
580 ( stream_position_field(Prop, Pos)
581 -> arg(Pos, Term, Value)
582 ; throw(error(domain_error(stream_position_data, Prop)))
583 ).
584stream_position_data(Prop, Term, Value) :-
585 stream_position_field(Prop, Pos),
586 arg(Pos, Term, Value).
587
588stream_position_field(char_count, 1).
589stream_position_field(line_count, 2).
590stream_position_field(line_position, 3).
591stream_position_field(byte_count, 4).
592
593
594 597
603
604:- meta_predicate
605 call_with_depth_limit(0, +, -). 606
607call_with_depth_limit(G, Limit, Result) :-
608 '$depth_limit'(Limit, OLimit, OReached),
609 ( catch(G, E, '$depth_limit_except'(OLimit, OReached, E)),
610 '$depth_limit_true'(Limit, OLimit, OReached, Result, Det),
611 ( Det == ! -> ! ; true )
612 ; '$depth_limit_false'(OLimit, OReached, Result)
613 ).
614
625
626:- meta_predicate
627 call_with_inference_limit(0, +, -). 628
629call_with_inference_limit(G, Limit, Result) :-
630 '$inference_limit'(Limit, OLimit),
631 ( catch(G, Except,
632 system:'$inference_limit_except'(OLimit, Except, Result0)),
633 ( Result0 == inference_limit_exceeded
634 -> !
635 ; system:'$inference_limit_true'(Limit, OLimit, Result0),
636 ( Result0 == ! -> ! ; true )
637 ),
638 Result = Result0
639 ; system:'$inference_limit_false'(OLimit)
640 ).
641
642
643 646
659
660
661:- meta_predicate
662 current_predicate(?, :),
663 '$defined_predicate'(:). 664
665current_predicate(Name, Module:Head) :-
666 (var(Module) ; var(Head)),
667 !,
668 generate_current_predicate(Name, Module, Head).
669current_predicate(Name, Term) :-
670 '$c_current_predicate'(Name, Term),
671 '$defined_predicate'(Term),
672 !.
673current_predicate(Name, Module:Head) :-
674 default_module(Module, DefModule),
675 '$c_current_predicate'(Name, DefModule:Head),
676 '$defined_predicate'(DefModule:Head),
677 !.
678current_predicate(Name, Module:Head) :-
679 '$autoload':autoload_in(Module, general),
680 \+ current_prolog_flag(Module:unknown, fail),
681 ( compound(Head)
682 -> compound_name_arity(Head, Name, Arity)
683 ; Name = Head, Arity = 0
684 ),
685 '$find_library'(Module, Name, Arity, _LoadModule, _Library),
686 !.
687
688generate_current_predicate(Name, Module, Head) :-
689 current_module(Module),
690 QHead = Module:Head,
691 '$c_current_predicate'(Name, QHead),
692 '$get_predicate_attribute'(QHead, defined, 1).
693
694'$defined_predicate'(Head) :-
695 '$get_predicate_attribute'(Head, defined, 1),
696 !.
697
701
702:- meta_predicate
703 predicate_property(:, ?). 704
705:- multifile
706 '$predicate_property'/2. 707
708:- '$iso'(predicate_property/2). 709
710predicate_property(Pred, Property) :- 711 nonvar(Property),
712 !,
713 property_predicate(Property, Pred).
714predicate_property(Pred, Property) :- 715 define_or_generate(Pred),
716 '$predicate_property'(Property, Pred).
717
723
724property_predicate(undefined, Pred) :-
725 !,
726 Pred = Module:Head,
727 current_module(Module),
728 '$c_current_predicate'(_, Pred),
729 \+ '$defined_predicate'(Pred), 730 \+ current_predicate(_, Pred),
731 goal_name_arity(Head, Name, Arity),
732 \+ system_undefined(Module:Name/Arity).
733property_predicate(visible, Pred) :-
734 !,
735 visible_predicate(Pred).
736property_predicate(autoload(File), Head) :-
737 !,
738 \+ current_prolog_flag(autoload, false),
739 '$autoload':autoloadable(Head, File).
740property_predicate(implementation_module(IM), M:Head) :-
741 !,
742 atom(M),
743 ( default_module(M, DM),
744 '$get_predicate_attribute'(DM:Head, defined, 1)
745 -> ( '$get_predicate_attribute'(DM:Head, imported, ImportM)
746 -> IM = ImportM
747 ; IM = M
748 )
749 ; \+ current_prolog_flag(M:unknown, fail),
750 goal_name_arity(Head, Name, Arity),
751 '$find_library'(_, Name, Arity, LoadModule, _File)
752 -> IM = LoadModule
753 ; M = IM
754 ).
755property_predicate(iso, _:Head) :-
756 callable(Head),
757 !,
758 goal_name_arity(Head, Name, Arity),
759 current_predicate(system:Name/Arity),
760 '$predicate_property'(iso, system:Head).
761property_predicate(built_in, Module:Head) :-
762 callable(Head),
763 !,
764 goal_name_arity(Head, Name, Arity),
765 current_predicate(Module:Name/Arity),
766 '$predicate_property'(built_in, Module:Head).
767property_predicate(Property, Pred) :-
768 define_or_generate(Pred),
769 '$predicate_property'(Property, Pred).
770
771goal_name_arity(Head, Name, Arity) :-
772 compound(Head),
773 !,
774 compound_name_arity(Head, Name, Arity).
775goal_name_arity(Head, Head, 0).
776
777
783
784define_or_generate(M:Head) :-
785 callable(Head),
786 atom(M),
787 '$get_predicate_attribute'(M:Head, defined, 1),
788 !.
789define_or_generate(M:Head) :-
790 callable(Head),
791 nonvar(M), M \== system,
792 !,
793 '$define_predicate'(M:Head).
794define_or_generate(Pred) :-
795 current_predicate(_, Pred),
796 '$define_predicate'(Pred).
797
798
799'$predicate_property'(interpreted, Pred) :-
800 '$get_predicate_attribute'(Pred, foreign, 0).
801'$predicate_property'(visible, Pred) :-
802 '$get_predicate_attribute'(Pred, defined, 1).
803'$predicate_property'(built_in, Pred) :-
804 '$get_predicate_attribute'(Pred, system, 1).
805'$predicate_property'(exported, Pred) :-
806 '$get_predicate_attribute'(Pred, exported, 1).
807'$predicate_property'(public, Pred) :-
808 '$get_predicate_attribute'(Pred, public, 1).
809'$predicate_property'(non_terminal, Pred) :-
810 '$get_predicate_attribute'(Pred, non_terminal, 1).
811'$predicate_property'(foreign, Pred) :-
812 '$get_predicate_attribute'(Pred, foreign, 1).
813'$predicate_property'((dynamic), Pred) :-
814 '$get_predicate_attribute'(Pred, (dynamic), 1).
815'$predicate_property'((static), Pred) :-
816 '$get_predicate_attribute'(Pred, (dynamic), 0).
817'$predicate_property'((volatile), Pred) :-
818 '$get_predicate_attribute'(Pred, (volatile), 1).
819'$predicate_property'((thread_local), Pred) :-
820 '$get_predicate_attribute'(Pred, (thread_local), 1).
821'$predicate_property'((multifile), Pred) :-
822 '$get_predicate_attribute'(Pred, (multifile), 1).
823'$predicate_property'((discontiguous), Pred) :-
824 '$get_predicate_attribute'(Pred, (discontiguous), 1).
825'$predicate_property'(imported_from(Module), Pred) :-
826 '$get_predicate_attribute'(Pred, imported, Module).
827'$predicate_property'(transparent, Pred) :-
828 '$get_predicate_attribute'(Pred, transparent, 1).
829'$predicate_property'(meta_predicate(Pattern), Pred) :-
830 '$get_predicate_attribute'(Pred, meta_predicate, Pattern).
831'$predicate_property'(file(File), Pred) :-
832 '$get_predicate_attribute'(Pred, file, File).
833'$predicate_property'(line_count(LineNumber), Pred) :-
834 '$get_predicate_attribute'(Pred, line_count, LineNumber).
835'$predicate_property'(notrace, Pred) :-
836 '$get_predicate_attribute'(Pred, trace, 0).
837'$predicate_property'(nodebug, Pred) :-
838 '$get_predicate_attribute'(Pred, hide_childs, 1).
839'$predicate_property'(spying, Pred) :-
840 '$get_predicate_attribute'(Pred, spy, 1).
841'$predicate_property'(number_of_clauses(N), Pred) :-
842 '$get_predicate_attribute'(Pred, number_of_clauses, N).
843'$predicate_property'(number_of_rules(N), Pred) :-
844 '$get_predicate_attribute'(Pred, number_of_rules, N).
845'$predicate_property'(last_modified_generation(Gen), Pred) :-
846 '$get_predicate_attribute'(Pred, last_modified_generation, Gen).
847'$predicate_property'(indexed(Indices), Pred) :-
848 '$get_predicate_attribute'(Pred, indexed, Indices).
849'$predicate_property'(noprofile, Pred) :-
850 '$get_predicate_attribute'(Pred, noprofile, 1).
851'$predicate_property'(ssu, Pred) :-
852 '$get_predicate_attribute'(Pred, ssu, 1).
853'$predicate_property'(iso, Pred) :-
854 '$get_predicate_attribute'(Pred, iso, 1).
855'$predicate_property'(det, Pred) :-
856 '$get_predicate_attribute'(Pred, det, 1).
857'$predicate_property'(sig_atomic, Pred) :-
858 '$get_predicate_attribute'(Pred, sig_atomic, 1).
859'$predicate_property'(quasi_quotation_syntax, Pred) :-
860 '$get_predicate_attribute'(Pred, quasi_quotation_syntax, 1).
861'$predicate_property'(defined, Pred) :-
862 '$get_predicate_attribute'(Pred, defined, 1).
863'$predicate_property'(tabled, Pred) :-
864 '$get_predicate_attribute'(Pred, tabled, 1).
865'$predicate_property'(tabled(Flag), Pred) :-
866 '$get_predicate_attribute'(Pred, tabled, 1),
867 table_flag(Flag, Pred).
868'$predicate_property'(incremental, Pred) :-
869 '$get_predicate_attribute'(Pred, incremental, 1).
870'$predicate_property'(monotonic, Pred) :-
871 '$get_predicate_attribute'(Pred, monotonic, 1).
872'$predicate_property'(opaque, Pred) :-
873 '$get_predicate_attribute'(Pred, opaque, 1).
874'$predicate_property'(lazy, Pred) :-
875 '$get_predicate_attribute'(Pred, lazy, 1).
876'$predicate_property'(abstract(N), Pred) :-
877 '$get_predicate_attribute'(Pred, abstract, N).
878'$predicate_property'(size(Bytes), Pred) :-
879 '$get_predicate_attribute'(Pred, size, Bytes).
880
881system_undefined(user:prolog_trace_interception/4).
882system_undefined(prolog:prolog_exception_hook/5).
883system_undefined(system:'$c_call_prolog'/0).
884system_undefined(system:window_title/2).
885
886table_flag(variant, Pred) :-
887 '$tbl_implementation'(Pred, M:Head),
888 M:'$tabled'(Head, variant).
889table_flag(subsumptive, Pred) :-
890 '$tbl_implementation'(Pred, M:Head),
891 M:'$tabled'(Head, subsumptive).
892table_flag(shared, Pred) :-
893 '$get_predicate_attribute'(Pred, tshared, 1).
894table_flag(incremental, Pred) :-
895 '$get_predicate_attribute'(Pred, incremental, 1).
896table_flag(monotonic, Pred) :-
897 '$get_predicate_attribute'(Pred, monotonic, 1).
898table_flag(subgoal_abstract(N), Pred) :-
899 '$get_predicate_attribute'(Pred, subgoal_abstract, N).
900table_flag(answer_abstract(N), Pred) :-
901 '$get_predicate_attribute'(Pred, subgoal_abstract, N).
902table_flag(subgoal_abstract(N), Pred) :-
903 '$get_predicate_attribute'(Pred, max_answers, N).
904
905
911
912visible_predicate(Pred) :-
913 Pred = M:Head,
914 current_module(M),
915 ( callable(Head)
916 -> ( '$get_predicate_attribute'(Pred, defined, 1)
917 -> true
918 ; \+ current_prolog_flag(M:unknown, fail),
919 '$head_name_arity'(Head, Name, Arity),
920 '$find_library'(M, Name, Arity, _LoadModule, _Library)
921 )
922 ; setof(PI, visible_in_module(M, PI), PIs),
923 '$member'(Name/Arity, PIs),
924 functor(Head, Name, Arity)
925 ).
926
927visible_in_module(M, Name/Arity) :-
928 default_module(M, DefM),
929 DefHead = DefM:Head,
930 '$c_current_predicate'(_, DefHead),
931 '$get_predicate_attribute'(DefHead, defined, 1),
932 \+ hidden_system_predicate(Head),
933 functor(Head, Name, Arity).
934visible_in_module(_, Name/Arity) :-
935 '$in_library'(Name, Arity, _).
936
937hidden_system_predicate(Head) :-
938 functor(Head, Name, _),
939 atom(Name), 940 sub_atom(Name, 0, _, _, $),
941 \+ current_prolog_flag(access_level, system).
942
943
965
966clause_property(Clause, Property) :-
967 '$clause_property'(Property, Clause).
968
969'$clause_property'(line_count(LineNumber), Clause) :-
970 '$get_clause_attribute'(Clause, line_count, LineNumber).
971'$clause_property'(file(File), Clause) :-
972 '$get_clause_attribute'(Clause, file, File).
973'$clause_property'(source(File), Clause) :-
974 '$get_clause_attribute'(Clause, owner, File).
975'$clause_property'(size(Bytes), Clause) :-
976 '$get_clause_attribute'(Clause, size, Bytes).
977'$clause_property'(fact, Clause) :-
978 '$get_clause_attribute'(Clause, fact, true).
979'$clause_property'(erased, Clause) :-
980 '$get_clause_attribute'(Clause, erased, true).
981'$clause_property'(predicate(PI), Clause) :-
982 '$get_clause_attribute'(Clause, predicate_indicator, PI).
983'$clause_property'(module(M), Clause) :-
984 '$get_clause_attribute'(Clause, module, M).
985
997
998dynamic(M:Predicates, Options) :-
999 '$must_be'(list, Predicates),
1000 options_properties(Options, Props),
1001 set_pprops(Predicates, M, [dynamic|Props]).
1002
1003set_pprops([], _, _).
1004set_pprops([H|T], M, Props) :-
1005 set_pprops1(Props, M:H),
1006 strip_module(M:H, M2, P),
1007 '$pi_head'(M2:P, Pred),
1008 '$set_table_wrappers'(Pred),
1009 set_pprops(T, M, Props).
1010
1011set_pprops1([], _).
1012set_pprops1([H|T], P) :-
1013 ( atom(H)
1014 -> '$set_predicate_attribute'(P, H, true)
1015 ; H =.. [Name,Value]
1016 -> '$set_predicate_attribute'(P, Name, Value)
1017 ),
1018 set_pprops1(T, P).
1019
1020options_properties(Options, Props) :-
1021 G = opt_prop(_,_,_,_),
1022 findall(G, G, Spec),
1023 options_properties(Spec, Options, Props).
1024
1025options_properties([], _, []).
1026options_properties([opt_prop(Name, Type, SetValue, Prop)|T],
1027 Options, [Prop|PT]) :-
1028 Opt =.. [Name,V],
1029 '$option'(Opt, Options),
1030 '$must_be'(Type, V),
1031 V = SetValue,
1032 !,
1033 options_properties(T, Options, PT).
1034options_properties([_|T], Options, PT) :-
1035 options_properties(T, Options, PT).
1036
1037opt_prop(incremental, boolean, Bool, incremental(Bool)).
1038opt_prop(abstract, between(0,0), 0, abstract).
1039opt_prop(multifile, boolean, true, multifile).
1040opt_prop(discontiguous, boolean, true, discontiguous).
1041opt_prop(volatile, boolean, true, volatile).
1042opt_prop(thread, oneof(atom, [local,shared],[local,shared]),
1043 local, thread_local).
1044
1045 1048
1052
1053current_module(Module) :-
1054 '$current_module'(Module, _).
1055
1069
1070module_property(Module, Property) :-
1071 nonvar(Module), nonvar(Property),
1072 !,
1073 property_module(Property, Module).
1074module_property(Module, Property) :- 1075 nonvar(Property), Property = file(File),
1076 !,
1077 ( nonvar(File)
1078 -> '$current_module'(Modules, File),
1079 ( atom(Modules)
1080 -> Module = Modules
1081 ; '$member'(Module, Modules)
1082 )
1083 ; '$current_module'(Module, File),
1084 File \== []
1085 ).
1086module_property(Module, Property) :-
1087 current_module(Module),
1088 property_module(Property, Module).
1089
1090property_module(Property, Module) :-
1091 module_property(Property),
1092 ( Property = exported_operators(List)
1093 -> '$exported_ops'(Module, List, [])
1094 ; '$module_property'(Module, Property)
1095 ).
1096
1097module_property(class(_)).
1098module_property(file(_)).
1099module_property(line_count(_)).
1100module_property(exports(_)).
1101module_property(exported_operators(_)).
1102module_property(size(_)).
1103module_property(program_size(_)).
1104module_property(program_space(_)).
1105module_property(last_modified_generation(_)).
1106
1110
1111module(Module) :-
1112 atom(Module),
1113 current_module(Module),
1114 !,
1115 '$set_typein_module'(Module).
1116module(Module) :-
1117 '$set_typein_module'(Module),
1118 print_message(warning, no_current_module(Module)).
1119
1124
1125working_directory(Old, New) :-
1126 '$cwd'(Old),
1127 ( Old == New
1128 -> true
1129 ; '$chdir'(New)
1130 ).
1131
1132
1133 1136
1140
1141current_trie(Trie) :-
1142 current_blob(Trie, trie),
1143 is_trie(Trie).
1144
1178
1179trie_property(Trie, Property) :-
1180 current_trie(Trie),
1181 trie_property(Property),
1182 '$trie_property'(Trie, Property).
1183
1184trie_property(node_count(_)).
1185trie_property(value_count(_)).
1186trie_property(size(_)).
1187trie_property(hashed(_)).
1188trie_property(compiled_size(_)).
1189 1190trie_property(lookup_count(_)). 1191trie_property(gen_call_count(_)).
1192trie_property(invalidated(_)). 1193trie_property(reevaluated(_)).
1194trie_property(deadlock(_)). 1195trie_property(wait(_)).
1196trie_property(idg_affected_count(_)).
1197trie_property(idg_dependent_count(_)).
1198trie_property(idg_size(_)).
1199
1200
1201 1204
1205shell(Command) :-
1206 shell(Command, 0).
1207
1208
1209 1212
1213:- meta_predicate
1214 on_signal(+, :, :),
1215 current_signal(?, ?, :). 1216
1218
1219on_signal(Signal, Old, New) :-
1220 atom(Signal),
1221 !,
1222 '$on_signal'(_Num, Signal, Old, New).
1223on_signal(Signal, Old, New) :-
1224 integer(Signal),
1225 !,
1226 '$on_signal'(Signal, _Name, Old, New).
1227on_signal(Signal, _Old, _New) :-
1228 '$type_error'(signal_name, Signal).
1229
1231
1232current_signal(Name, Id, Handler) :-
1233 between(1, 32, Id),
1234 '$on_signal'(Id, Name, Handler, Handler).
1235
1236:- multifile
1237 prolog:called_by/2. 1238
1239prolog:called_by(on_signal(_,_,New), [New+1]) :-
1240 ( new == throw
1241 ; new == default
1242 ), !, fail.
1243
1244
1245 1248
1249format(Fmt) :-
1250 format(Fmt, []).
1251
1252 1255
1257
1258absolute_file_name(Name, Abs) :-
1259 atomic(Name),
1260 !,
1261 '$absolute_file_name'(Name, Abs).
1262absolute_file_name(Term, Abs) :-
1263 '$chk_file'(Term, [''], [access(read)], true, File),
1264 !,
1265 '$absolute_file_name'(File, Abs).
1266absolute_file_name(Term, Abs) :-
1267 '$chk_file'(Term, [''], [], true, File),
1268 !,
1269 '$absolute_file_name'(File, Abs).
1270
1276
1277tmp_file_stream(Enc, File, Stream) :-
1278 atom(Enc), var(File), var(Stream),
1279 !,
1280 '$tmp_file_stream'('', Enc, File, Stream).
1281tmp_file_stream(File, Stream, Options) :-
1282 current_prolog_flag(encoding, DefEnc),
1283 '$option'(encoding(Enc), Options, DefEnc),
1284 '$option'(extension(Ext), Options, ''),
1285 '$tmp_file_stream'(Ext, Enc, File, Stream),
1286 set_stream(Stream, file_name(File)).
1287
1288
1289 1292
1299
1300garbage_collect :-
1301 '$garbage_collect'(0).
1302
1306
1307set_prolog_stack(Stack, Option) :-
1308 Option =.. [Name,Value0],
1309 Value is Value0,
1310 '$set_prolog_stack'(Stack, Name, _Old, Value).
1311
1315
1316prolog_stack_property(Stack, Property) :-
1317 stack_property(P),
1318 stack_name(Stack),
1319 Property =.. [P,Value],
1320 '$set_prolog_stack'(Stack, P, Value, Value).
1321
1322stack_name(local).
1323stack_name(global).
1324stack_name(trail).
1325
1326stack_property(limit).
1327stack_property(spare).
1328stack_property(min_free).
1329stack_property(low).
1330stack_property(factor).
1331
1332
1333 1336
1342
1343rule(Head, Rule) :-
1344 '$rule'(Head, Rule0),
1345 conditional_rule(Rule0, Rule1),
1346 Rule = Rule1.
1347rule(Head, Rule, Ref) :-
1348 '$rule'(Head, Rule0, Ref),
1349 conditional_rule(Rule0, Rule1),
1350 Rule = Rule1.
1351
1352conditional_rule(?=>(Head, (!, Body)), Rule) =>
1353 Rule = (Head => Body).
1354conditional_rule(?=>(Head, !), Rule) =>
1355 Rule = (Head => true).
1356conditional_rule(?=>(Head, Body0), Rule),
1357 split_on_cut(Body0, Cond, Body) =>
1358 Rule = (Head,Cond=>Body).
1359conditional_rule(Head, Rule) =>
1360 Rule = Head.
1361
1362split_on_cut((Cond0,!,Body0), Cond, Body) =>
1363 Cond = Cond0,
1364 Body = Body0.
1365split_on_cut((!,Body0), Cond, Body) =>
1366 Cond = true,
1367 Body = Body0.
1368split_on_cut((A,B), Cond, Body) =>
1369 Cond = (A,Cond1),
1370 split_on_cut(B, Cond1, Body).
1371split_on_cut(_, _, _) =>
1372 fail.
1373
1374
1375 1378
1379:- '$iso'((numbervars/3)). 1380
1386
1387numbervars(Term, From, To) :-
1388 numbervars(Term, From, To, []).
1389
1390
1391 1394
1398
1399term_string(Term, String, Options) :-
1400 nonvar(String),
1401 !,
1402 read_term_from_atom(String, Term, Options).
1403term_string(Term, String, Options) :-
1404 ( '$option'(quoted(_), Options)
1405 -> Options1 = Options
1406 ; '$merge_options'(_{quoted:true}, Options, Options1)
1407 ),
1408 format(string(String), '~W', [Term, Options1]).
1409
1410
1411 1414
1418
1419nb_setval(Name, Value) :-
1420 duplicate_term(Value, Copy),
1421 nb_linkval(Name, Copy).
1422
1423
1424 1427
1428:- meta_predicate
1429 thread_create(0, -). 1430
1434
1435thread_create(Goal, Id) :-
1436 thread_create(Goal, Id, []).
1437
1444
1445thread_join(Id) :-
1446 thread_join(Id, Status),
1447 ( Status == true
1448 -> true
1449 ; throw(error(thread_error(Id, Status), _))
1450 ).
1451
1455
1459
1460sig_block(Pattern) :-
1461 ( nb_current('$sig_blocked', List)
1462 -> true
1463 ; List = []
1464 ),
1465 nb_setval('$sig_blocked', [Pattern|List]).
1466
1467sig_unblock(Pattern) :-
1468 ( nb_current('$sig_blocked', List)
1469 -> unblock(List, Pattern, NewList),
1470 ( List == NewList
1471 -> true
1472 ; nb_setval('$sig_blocked', NewList),
1473 '$sig_unblock'
1474 )
1475 ; true
1476 ).
1477
1478unblock([], _, []).
1479unblock([H|T], P, List) :-
1480 ( subsumes_term(P, H)
1481 -> unblock(T, P, List)
1482 ; List = [H|T1],
1483 unblock(T, P, T1)
1484 ).
1485
1486:- public signal_is_blocked/1. 1487
1488signal_is_blocked(Head) :-
1489 nb_current('$sig_blocked', List),
1490 memberchk(Head, List).
1491
1506
1507set_prolog_gc_thread(Status) :-
1508 var(Status),
1509 !,
1510 '$instantiation_error'(Status).
1511set_prolog_gc_thread(_) :-
1512 \+ current_prolog_flag(threads, true),
1513 !.
1514set_prolog_gc_thread(false) :-
1515 !,
1516 set_prolog_flag(gc_thread, false),
1517 ( current_prolog_flag(threads, true)
1518 -> ( '$gc_stop'
1519 -> thread_join(gc)
1520 ; true
1521 )
1522 ; true
1523 ).
1524set_prolog_gc_thread(true) :-
1525 !,
1526 set_prolog_flag(gc_thread, true).
1527set_prolog_gc_thread(stop) :-
1528 !,
1529 ( current_prolog_flag(threads, true)
1530 -> ( '$gc_stop'
1531 -> thread_join(gc)
1532 ; true
1533 )
1534 ; true
1535 ).
1536set_prolog_gc_thread(Status) :-
1537 '$domain_error'(gc_thread, Status).
1538
1545
1546transaction(Goal) :-
1547 '$transaction'(Goal, []).
1548transaction(Goal, Options) :-
1549 '$transaction'(Goal, Options).
1550transaction(Goal, Constraint, Mutex) :-
1551 '$transaction'(Goal, Constraint, Mutex).
1552snapshot(Goal) :-
1553 '$snapshot'(Goal).
1554
1555
1556 1559
1560:- meta_predicate
1561 undo(0). 1562
1567
1568undo(Goal) :-
1569 '$undo'(Goal).
1570
1571:- public
1572 '$run_undo'/1. 1573
1574'$run_undo'([One]) :-
1575 !,
1576 ( call(One)
1577 -> true
1578 ; true
1579 ).
1580'$run_undo'(List) :-
1581 run_undo(List, _, Error),
1582 ( var(Error)
1583 -> true
1584 ; throw(Error)
1585 ).
1586
1587run_undo([], E, E).
1588run_undo([H|T], E0, E) :-
1589 ( catch(H, E1, true)
1590 -> ( var(E1)
1591 -> true
1592 ; '$urgent_exception'(E0, E1, E2)
1593 )
1594 ; true
1595 ),
1596 run_undo(T, E2, E).
1597
1598
1603
1604:- meta_predicate
1605 '$wrap_predicate'(:, +, -, -, +). 1606
1607'$wrap_predicate'(M:Head, WName, Closure, call(Wrapped), Body) :-
1608 callable_name_arguments(Head, PName, Args),
1609 callable_name_arity(Head, PName, Arity),
1610 ( is_most_general_term(Head)
1611 -> true
1612 ; '$domain_error'(most_general_term, Head)
1613 ),
1614 atomic_list_concat(['$wrap$', PName], WrapName),
1615 PI = M:WrapName/Arity,
1616 dynamic(PI),
1617 '$notransact'(PI),
1618 volatile(PI),
1619 module_transparent(PI),
1620 WHead =.. [WrapName|Args],
1621 '$c_wrap_predicate'(M:Head, WName, Closure, Wrapped, M:(WHead :- Body)).
1622
1623callable_name_arguments(Head, PName, Args) :-
1624 atom(Head),
1625 !,
1626 PName = Head,
1627 Args = [].
1628callable_name_arguments(Head, PName, Args) :-
1629 compound_name_arguments(Head, PName, Args).
1630
1631callable_name_arity(Head, PName, Arity) :-
1632 atom(Head),
1633 !,
1634 PName = Head,
1635 Arity = 0.
1636callable_name_arity(Head, PName, Arity) :-
1637 compound_name_arity(Head, PName, Arity)