pce_thread(-Thread) is det- True if Thread is the Prolog thread that runs the graphics
message loop.
- See also
- - pce_dispatch/1.
in_pce_thread_sync(:Goal) is semidet- Same as in_pce_thread/1, but wait for Goal to be completed.
Success depends on the success of executing Goal. If Goal throws
an exception, this exception is re-thrown by in_pce_thread/1.
Possible bindings of Goal are returned, but be aware that the
term has been copied. If in_pce_thread_sync/1 is called in the
thread running pce, it behaves as once/1.
prolog:locate_clauses(Term, Refs)[multifile]- Locate a list of clause-references from a method-specification
like Class->Method.
see library(listing).
Re-exported predicates
The following predicates are exported from this file while their implementation is defined in imported modules or non-module files loaded by this module.
pce_autoload(+ClassName, +FileSpec)- States class `ClassName' can be created by loading the Prolog
file `FileSpec'. This will actually be done if either the class
is actually needed by PCE or pce_autoload_all/0 is called.
pce_catch_error(?Errors, :Goal)- Run goal, fail silently on indicated errors. If the first argument
is a variable, any error will be catched.
pce_compiling(-ClassName)- External function to get the current classname
pce_global(+Object, :Goal) is det- Register Goal to be a goal that creates @Reference
pce_begin_class_definition(+ClassName, +Meta, +Super, +Summary)- Dummy to allow cross-referencing and other tools to locate
class-definitions after term-expansion.
pce_prolog_class(?ClassName:atom) is nondet
pce_prolog_class(?ClassName:atom, ?SuperName:atom) is nondet- Is true if ClassName refers to a class defined in Prolog with
the given superclass.
pce_prolog_class(?ClassName:atom) is nondet
pce_prolog_class(?ClassName:atom, ?SuperName:atom) is nondet- Is true if ClassName refers to a class defined in Prolog with
the given superclass.
Undocumented predicates
The following predicates are exported, but not or incorrectly documented.
get(Arg1, Arg2, Arg3, Arg4)
get(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7, Arg8)
send(Arg1, Arg2)
send(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6)
pce_extended_class(Arg1)
object(Arg1, Arg2)
pce_end_recording
send_class(Arg1, Arg2, Arg3)
get(Arg1, Arg2, Arg3, Arg4, Arg5)
send(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7)
send(Arg1, Arg2, Arg3)
pce_open(Arg1, Arg2, Arg3)
pce_compiling(Arg1, Arg2)
set_pce_thread
get(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6)
send(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7, Arg8)
send(Arg1, Arg2, Arg3, Arg4)
new(Arg1, Arg2)
pce_begin_recording(Arg1)
get_class(Arg1, Arg2, Arg3, Arg4)
pce_dispatch
get(Arg1, Arg2, Arg3)
get(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7)
in_pce_thread(Arg1)
send(Arg1, Arg2, Arg3, Arg4, Arg5)
free(Arg1)
pce_register_class(Arg1)
pce_term_expansion(Arg1, Arg2)
pce_autoload_all
object(Arg1)