
syspred.pl
style_check(+Spec) is nondet
flag(+Name, -Old, +New) is det
source_file(-File) is nondetNote that Time = 0 is used by PlDoc and other code that needs to create a file record without being interested in the time.
source_file(+Head, -File) is semidet
source_file_property(?File, ?Property) is nondet
exists_source(+Source) is semidet
exists_source(+Source, -Path) is semidet:- if(exists_source(library(error))). :- use_module_library(error). :- endif.
prolog_load_context(+Key, -Value)
unload_file(+File) is det
use_foreign_library(+FileSpec) is det
use_foreign_library(+FileSpec, +Entry:atom) is detnow. This is similar to using:
:- initialization(load_foreign_library(foreign(mylib))).
but using the initialization/1 wrapper causes the library to be loaded after loading of the file in which it appears is completed, while use_foreign_library/1 loads the library immediately. I.e. the difference is only relevant if the remainder of the file uses functionality of the C-library.
stream_position_data(?Field, +Pos, ?Date)
call_with_depth_limit(:Goal, +DepthLimit, -Result)
call_with_inference_limit(:Goal, +InferenceLimit, -Result)call(Goal), but poses a limit on the number of
inferences. If this limit is reached, Result is unified with
inference_limit_exceeded, otherwise Result is unified with ! if
Goal succeeded without a choicepoint and true otherwise.
Note that we perform calls in system to avoid auto-importing, which
makes raiseInferenceLimitException() fail to recognise that the
exception happens in the overhead.
predicate_property(?Predicate, ?Property) is nondet
clause_property(+ClauseRef, ?Property) is nondettrue.
dynamic(:Predicates, +Options) is detincremental(+Bool)abstract(+Level)multifile(+Bool)discontiguous(+Bool)thread(+Mode)volatile(+Bool)
current_module(?Module) is nondet
module_property(?Module, ?Property) is nondet
module(+Module) is det
working_directory(-Old, +New)
current_trie(?Trie) is nondet
trie_property(?Trie, ?Property)Incremental tabling statistics:
Shared tabling statistics:
on_signal(+Signal, -OldHandler, :NewHandler) is det
current_signal(?Name, ?SignalNumber, :Handler) is nondet
absolute_file_name(+Term, -AbsoluteFile)
tmp_file_stream(-File, -Stream, +Options) is det
garbage_collect is det
set_prolog_stack(+Name, +Option) is det
prolog_stack_property(?Stack, ?Property) is nondet
rule(:Head, -Rule) is nondet
rule(:Head, -Rule, Ref) is nondet:-
as neck.
numbervars(+Term, +StartIndex, -EndIndex) is det
term_string(?Term, ?String, +Options)
thread_create(:Goal, -Id)thread_create(Goal, Id, []).
thread_join(+Id)
sig_block(:Pattern) is det
sig_unblock(:Pattern) is det
set_prolog_gc_thread(+Status)gc.gc thread if it is running. The thread is recreated
on the next implicit atom or clause garbage collection. Used
by fork/1 to avoid forking a multi-threaded application.
transaction(:Goal)
transaction(:Goal, +Options)
transaction(:Goal, :Constraint, +Mutex)
snapshot(:Goal)
undo(:Goal)
$wrap_predicate(:Head, +Name, -Closure, -Wrapped, :Body) is detThe following predicates are exported, but not or incorrectly documented.
$defined_predicate(Arg1)
current_predicate(Arg1, Arg2)
atom_prefix(Arg1, Arg2)
format(Arg1)
visible(Arg1)
rule(Arg1, Arg2, Arg3)
exists_source(Arg1, Arg2)
leash(Arg1)
dwim_match(Arg1, Arg2)
use_foreign_library(Arg1, Arg2)
$predicate_property(Arg1, Arg2)
transaction(Arg1, Arg2, Arg3)
snapshot(Arg1)
shell(Arg1)
transaction(Arg1, Arg2)