PublicShow sourcepce.pl

Sourcepce_thread(-Thread) is det
True if Thread is the Prolog thread that runs the graphics message loop.
See also
- pce_dispatch/1.
Sourcein_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.

Sourceprolog: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 re-exported from other modules

Sourcepce_prolog_class(?ClassName:atom) is nondet
Sourcepce_prolog_class(?ClassName:atom, ?SuperName:atom) is nondet
Is true if ClassName refers to a class defined in Prolog with the given superclass.
Sourcefree(+Ref) is det
Delete object if it exists.
Sourcepce_prolog_class(?ClassName:atom) is nondet
Sourcepce_prolog_class(?ClassName:atom, ?SuperName:atom) is nondet
Is true if ClassName refers to a class defined in Prolog with the given superclass.
Sourcepce_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.
Sourcesend(+Object, +Selector, +Arg...) is semidet
Succeeds if sending a message to Object with Selector and the given Arguments succeeds. Normally, goal_expansion/2 expands all these goals into send(Receiver, Method(Args...)).
Sourcepce_begin_class_definition(+ClassName, +Meta, +Super, +Summary)
Dummy to allow cross-referencing and other tools to locate class-definitions after term-expansion.
Sourcepce_global(+Object, :Goal) is det
Register Goal to be a goal that creates @Reference
Sourceget(+Object, :Selector, +Arg..., ?Rval) is semidet
See the comments with send/[3-12].
Sourcepce_autoload_all
Load all classes declared using the pce_autoload/2 directive. Useful for debugging purposes.
Sourcepce_catch_error(?Errors, :Goal)
Run goal, fail silently on indicated errors. If the first argument is a variable, any error will be catched.
Sourcepce_compiling(-ClassName)
External function to get the current classname

Undocumented predicates

The following predicates are exported, but not or incorrectly documented.

Sourceget(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7)
Sourceobject(Arg1)
Sourceget(Arg1, Arg2, Arg3)
Sourcepce_dispatch
Sourcesend(Arg1, Arg2, Arg3, Arg4, Arg5)
Sourcenew(Arg1, Arg2)
Sourcepce_register_class(Arg1)
Sourcepce_term_expansion(Arg1, Arg2)
Sourceget(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6)
Sourcesend(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7, Arg8)
Sourceget_class(Arg1, Arg2, Arg3, Arg4)
Sourcesend(Arg1, Arg2, Arg3, Arg4)
Sourceset_pce_thread
Sourcein_pce_thread(Arg1)
Sourcepce_begin_recording(Arg1)
Sourceget(Arg1, Arg2, Arg3, Arg4, Arg5)
Sourcesend_class(Arg1, Arg2, Arg3)
Sourcepce_end_recording
Sourcesend(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7)
Sourcepce_open(Arg1, Arg2, Arg3)
Sourcepce_compiling(Arg1, Arg2)
Sourceget(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7, Arg8)
Sourcesend(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6)
Sourcesend(Arg1, Arg2)
Sourcepce_extended_class(Arg1)
Sourceobject(Arg1, Arg2)