pce.pl
- pce_thread(-Thread) is det
- True if Thread is the Prolog thread that runs the graphics message loop.
- 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 re-exported from other modules
- free(+Ref) is det
- Delete object if it exists.
- 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_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.
- send(+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...)).
- 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_begin_class_definition(+ClassName, +Meta, +Super, +Summary)
- Dummy to allow cross-referencing and other tools to locate class-definitions after term-expansion.
- pce_global(+Object, :Goal) is det
- Register Goal to be a goal that creates @Reference
- get(+Object, :Selector, +Arg..., ?Rval) is semidet
- See the comments with send/[3-12].
- 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_compiling(-ClassName)
- External function to get the current classname
- pce_autoload_all
- Load all classes declared using the pce_autoload/2 directive. Useful for debugging purposes.
Undocumented predicates
The following predicates are exported, but not or incorrectly documented.
- send(Arg1, Arg2, Arg3, Arg4, Arg5)
- get(Arg1, Arg2, Arg3)
- pce_register_class(Arg1)
- pce_dispatch
- pce_term_expansion(Arg1, Arg2)
- object(Arg1)
- get(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7)
- send(Arg1, Arg2, Arg3, Arg4)
- send(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7, Arg8)
- new(Arg1, Arg2)
- pce_open(Arg1, Arg2, Arg3)
- pce_begin_recording(Arg1)
- set_pce_thread
- get(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6)
- get_class(Arg1, Arg2, Arg3, Arg4)
- send(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7)
- get(Arg1, Arg2, Arg3, Arg4, Arg5)
- in_pce_thread(Arg1)
- pce_compiling(Arg1, Arg2)
- pce_end_recording
- send_class(Arg1, Arg2, Arg3)
- send(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6)
- send(Arg1, Arg2)
- pce_extended_class(Arg1)
- get(Arg1, Arg2, Arg3, Arg4, Arg5, Arg6, Arg7, Arg8)
- object(Arg1, Arg2)