aggregate.pl -- Aggregation operators on backtrackable predicates |
ansi_term.pl -- Print decorated text to ANSI consoles |
ansi_format/3 | Format text with ANSI attributes. |  |
ansi_get_color/2 | Obtain the RGB color for an ANSI color parameter. |  |
ansi_hyperlink/2 | Create a hyperlink for a terminal emulator. |  |
ansi_hyperlink/3 | Create a hyperlink for a terminal emulator. |  |
console_color/2 | Hook that allows for mapping abstract terms to concrete ANSI attributes. | |
message_line_element/2 | Hook implementation that deals with ansi(+Attr, +Fmt, +Args) in message specifications. |  |
apply.pl -- Apply predicates on a list |
convlist/3 | Similar to maplist/3, but elements for which call(Goal, ElemIn, _) fails are omitted from ListOut. |  |
exclude/3 | Filter elements for which Goal fails. |  |
foldl/4 | Fold an ensemble of m (0 <= m <= 4) lists of length n head-to-tail ("fold-left"), using columns of m list elements as arguments for Goal. |  |
foldl/5 | Fold an ensemble of m (0 <= m <= 4) lists of length n head-to-tail ("fold-left"), using columns of m list elements as arguments for Goal. |  |
foldl/6 | Fold an ensemble of m (0 <= m <= 4) lists of length n head-to-tail ("fold-left"), using columns of m list elements as arguments for Goal. |  |
foldl/7 | Fold an ensemble of m (0 <= m <= 4) lists of length n head-to-tail ("fold-left"), using columns of m list elements as arguments for Goal. |  |
include/3 | Filter elements for which Goal succeeds. |  |
maplist/2 | True if Goal is successfully applied on all matching elements of the list. |  |
maplist/3 | True if Goal is successfully applied on all matching elements of the list. |  |
maplist/4 | True if Goal is successfully applied on all matching elements of the list. |  |
maplist/5 | True if Goal is successfully applied on all matching elements of the list. |  |
partition/4 | Filter elements of List according to Pred. |  |
partition/5 | Filter List according to Pred in three sets. |  |
scanl/4 | Scan an ensemble of m (0 <= m <= 4) lists of length n head-to-tail ("scan-left"), using columns of m list elements as arguments for Goal. |  |
scanl/5 | Scan an ensemble of m (0 <= m <= 4) lists of length n head-to-tail ("scan-left"), using columns of m list elements as arguments for Goal. |  |
scanl/6 | Scan an ensemble of m (0 <= m <= 4) lists of length n head-to-tail ("scan-left"), using columns of m list elements as arguments for Goal. |  |
scanl/7 | Scan an ensemble of m (0 <= m <= 4) lists of length n head-to-tail ("scan-left"), using columns of m list elements as arguments for Goal. |  |
apply_macros.pl -- Goal expansion rules to avoid meta-calling |
apply_macros_sentinel/0 | Used to detect that library(apply_macros) is loaded into the current context explicitly. |  |
expand_phrase/2 | Provide goal-expansion for PhraseGoal. |  |
expand_phrase/4 | Provide goal-expansion for PhraseGoal. |  |
archive.pl -- Access several archive formats |
archive_close/1 | Close the archive. |  |
archive_create/3 | Convenience predicate to create an archive in OutputFile with data from a list of InputFiles and the given Options. |  |
archive_data_stream/3 | True when DataStream is a stream to a data object inside Archive. |  |
archive_entries/2 | True when Paths is a list of pathnames appearing in Archive. |  |
archive_extract/3 | Extract files from the given archive into Dir. |  |
archive_foldl/4 | Operates like foldl/4 but for the entries in the archive. |  |
archive_header_property/2 | True when Property is a property of the current header. |  |
archive_next_header/2 | Forward to the next entry of the archive for which Name unifies with the pathname of the entry. |  |
archive_open/3 | Wrapper around archive_open/4 that opens the archive in read mode. |  |
archive_open/4 | Open the archive in Data and unify Archive with a handle to the opened archive. |  |
archive_open_entry/2 | Open the current entry as a stream. |  |
archive_property/2 | True when Property is a property of the archive Handle. |  |
archive_set_header_property/2 | Set Property of the current header. |  |
arithmetic.pl -- Extensible arithmetic |
assoc.pl -- Binary associations |
atom.pl -- Operations on atoms |
backcomp.pl -- Backward compatibility |
base32.pl -- Base32 encoding and decoding |
base64.pl -- Base64 encoding and decoding |
bdb.pl -- Berkeley DB interface |
broadcast.pl -- Event service |
c14n2.pl -- C14n2 canonical XML documents |
cgi.pl -- Read CGI parameters |
charsio.pl -- I/O on Lists of Character Codes |
check.pl -- Consistency checking |
check_installation.pl -- Check installation issues and features |
check_config_files/0 | Examines the locations of config files. |  |
check_installation/0 | Check features of the installed system. |  |
check_installation/1 | As check_installation/0, but additionally returns a list of Component-Problem pairs. |  |
test_installation/0 | Run regression tests in the installed system. |  |
test_installation/1 | Run regression tests in the installed system. |  |
update_config_files/0 | Move config files from their old location to the new if the file or directory exists in the old location but not in the new. |  |
chr.pl |
codesio.pl -- I/O on Lists of Character Codes |
format_to_codes/3 | Use format/2 to write to a list of character codes. |  |
format_to_codes/4 | Use format/2 to write to a difference list of character codes. |  |
open_codes_stream/2 | Open Codes as an input stream. |  |
read_from_codes/2 | Read Codes into Term. |  |
read_term_from_codes/3 | Read Codes into Term. |  |
with_output_to_codes/2 | Run Goal with as once/1. |  |
with_output_to_codes/3 | Run Goal with as once/1. |  |
with_output_to_codes/4 | As with_output_to_codes/3, but Stream is unified with the temporary stream. |  |
write_term_to_codes/3 | True when Codes is a string that matches the output of write_term/3 using Options. |  |
write_term_to_codes/4 | True when Codes\Tail is a difference list containing the character codes that matches the output of write_term/3 using Options. |  |
write_to_codes/2 | Codes is a list of character codes produced by write/1 on Term. |  |
write_to_codes/3 | Codes is a difference-list of character codes produced by write/1 on Term. |  |
coinduction.pl -- Co-Logic Programming |
console_input.pl |
crypt.pl |
crypto.pl -- Cryptography and authentication library |
csv.pl -- Process CSV (Comma-Separated Values) data |
csv/3 | Prolog DCG to `read/write' CSV data. |  |
csv/4 | Prolog DCG to `read/write' CSV data. |  |
csv_options/2 | Compiled is the compiled representation of the CSV processing options as they may be passed into csv//2, etc. |  |
csv_read_file/2 | Read a CSV file into a list of rows. |  |
csv_read_file/3 | Read a CSV file into a list of rows. |  |
csv_read_file_row/3 | True when Row is a row in File. |  |
csv_read_row/3 | Read the next CSV record from Stream and unify the result with Row. |  |
csv_read_stream/3 | Read CSV data from Stream. |  |
csv_write_file/2 | Write a list of Prolog terms to a CSV file. |  |
csv_write_file/3 | Write a list of Prolog terms to a CSV file. |  |
csv_write_stream/3 | Write the rows in Data to Stream. |  |
ctypes.pl -- Character code classification |
is_digit/3 | Succeeds if `C' is a digit using `Base' as base and `Weight' represents its value. |  |
is_paren/2 | True if Open is the open-parenthesis of Close. |  |
to_lower/2 | Downcase a character code. |  |
to_upper/2 | Upcase a character code. |  |
upper_lower/2 | True when U is the character code of an uppercase character and L is the character code of the corresponding lowercase character. |  |
date.pl -- Process dates and times |
debug.pl -- Print debug messages and test assertions |
dialect.pl -- Support multiple Prolog dialects |
dicts.pl -- Dict utilities |
dif.pl -- The dif/2 constraint |
doc_files.pl -- Create stand-alone documentation files |
doc_http.pl -- Documentation server |
doc_latex.pl -- PlDoc LaTeX backend |
doc_latex/3 | Process one or more objects, writing the LaTeX output to OutFile. |  |
latex_for_file/3 | Generate a LaTeX description of all commented predicates in File, writing the LaTeX text to the stream Out. |  |
latex_for_predicates/3 | Generate LaTeX for a list of predicate indicators. |  |
latex_for_wiki_file/3 | Write a LaTeX translation of a Wiki file to the steam Out. |  |
double_metaphone.pl -- Phonetic string matching |
edinburgh.pl -- Some traditional Edinburgh predicates |
edit.pl -- Editor interface |
edit/0 | Edit associated or script file. |  |
edit/1 | Edit indicated object. |  |
edit_command/2 | This predicate should specify the shell-command called to invoke the user's editor. |  |
locate/2 | Locate object from the specified location. |  |
locate/3 | |  |
select_location/3 | |  |
editline.pl -- BSD libedit based command line editing |
error.pl |
current_encoding/1 | True if Name is the name of a supported encoding. |  |
current_type/3 | True when Type is a currently defined type and Var satisfies Type of the body term Body succeeds. |  |
domain_error/2 | The argument is of the proper type, but has a value that is outside the supported values. |  |
existence_error/2 | Culprit is of the correct type and correct domain, but there is no existing (external) resource of type ObjectType that is represented by it. |  |
existence_error/3 | Culprit is of the correct type and correct domain, but there is no existing (external) resource of type ObjectType that is represented by it in the provided set. |  |
has_type/2 | True if Term satisfies Type. |  |
instantiation_error/1 | An argument is under-instantiated. |  |
is_of_type/2 | True if Term satisfies Type. |  |
must_be/2 | True if Term satisfies the type constraints for Type. |  |
permission_error/3 | It is not allowed to perform Operation on (whatever is represented by) Culprit that is of the given PermissionType (in fact, the ISO Standard is confusing and vague about these terms' meaning). |  |
representation_error/1 | A representation error indicates a limitation of the implementation. |  |
resource_error/1 | A goal cannot be completed due to lack of resources. |  |
syntax_error/1 | A text has invalid syntax. |  |
type_error/2 | Tell the user that Culprit is not of the expected ValidType. |  |
uninstantiation_error/1 | An argument is over-instantiated. |  |
explain.pl -- Describe Prolog Terms |
fastrw.pl -- Fast reading and writing of terms |
files.pl |
filesex.pl -- Extended operations on files |
chmod/2 | Set the mode of the target file. |  |
copy_directory/2 | Copy the contents of the directory From to To (recursively). |  |
copy_file/2 | Copy a file into a new file or directory. |  |
delete_directory_and_contents/1 | Recursively remove the directory Dir and its contents. |  |
delete_directory_contents/1 | Remove all content from directory Dir, without removing Dir itself. |  |
directory_file_path/3 | True when Path is the full path-name for File in Dir. |  |
directory_member/3 | True when Member is a path inside Directory. |  |
ensure_directory/1 | Ensure the directory Dir exists. |  |
link_file/3 | Create a link in the filesystem from NewPath to OldPath. |  |
make_directory_path/1 | Create Dir and all required components (like mkdir -p). |  |
relative_file_name/3 | True when RelPath is Path, relative to the file RelToFile. |  |
set_time_file/3 | Query and set POSIX time attributes of a file. |  |
gensym.pl -- Generate unique symbols |
git.pl -- Run GIT commands |
hash_stream.pl -- Maintain a hash on a stream |
hashtable.pl -- Hash tables |
heaps.pl -- heaps/priority queues |
help.pl -- Text based manual |
hotfix.pl -- Load hotfixes into executables |
increval.pl -- Incremental dynamic predicate modification |
incr_directly_depends/2 | True if Goal1 depends on Goal2 in the IDG. |  |
incr_invalid_subgoals/1 | List is a sorted list (set) of the incremental subgoals that are currently invalid. |  |
incr_invalidate_call/1 | This is the XSB name, but the manual says incr_invalidate_calls/1 and the comment with the code suggests this is misnamed. |  |
incr_invalidate_calls/1 | Invalidate all tables for subgoals of Goal as well as tables that are affected by these. |  |
incr_is_invalid/1 | True when Subgoal's table is marked as invalid. |  |
incr_propagate_calls/1 | Activate the monotonic answer propagation similarly to when a new fact is asserted for a monotonic dynamic predicate. |  |
incr_table_update/0 | Updated all invalid tables. |  |
incr_trans_depends/2 | True for each pair in the transitive closure of incr_directly_depends(G1, G2) . |  |
is_incremental_subgoal/1 | This predicate non-deterministically unifies Subgoal with incrementally tabled subgoals that are currently table entries. |  |
intercept.pl -- Intercept and signal interface |
intercept/3 | Run Goal as call/1. |  |
intercept/4 | Similar to intercept/3, but the copy of Handler is called as call(Copy,Arg) , which allows passing large context arguments or arguments subject to unification or destructive assignment. |  |
intercept_all/4 | True when List contains all instances of Template that have been sent using send_signal/1 where the argument unifies with Ball. |  |
nb_intercept_all/4 | As intercept_all/4, but backtracing inside Goal does not reset List. |  |
send_signal/1 | If this predicate is called from a sub-goal of intercept/3, execute the associated Handler of the intercept/3 environment. |  |
send_silent_signal/1 | As send_signal/1, but succeed silently if there is no matching intercept environment. |  |
iostream.pl -- Utilities to deal with streams |
close_any/1 | Execute the Close closure returned by open_any/5. |  |
open_any/5 | Establish a stream from Specification that should be closed using Close, which can either be called or passed to close_any/1. |  |
iso_639.pl |
isub.pl -- isub: a string similarity measure |
janus.pl -- Call Python from Prolog |
jpl.pl -- A Java interface for SWI Prolog 7.x |
lazy_lists.pl -- Lazy list handling |
lazy_engine_next/4 | Lazy list iterator for engines. |  |
lazy_findall/3 | True when List is a lazy list containing the instantiations for Template for each answer of Goal. |  |
lazy_findall/4 | True when List is a lazy list containing the instantiations for Template for each answer of Goal. |  |
lazy_get_codes/4 | Lazy list iterator to get character codes from a stream. |  |
lazy_list/2 | Create a lazy list from a callback. |  |
lazy_list/3 | Create a lazy list where the next element is defined by. |  |
lazy_list_iterator/4 | Directive to create a lazy list iterator from a predicate that gets a single next value. |  |
lazy_list_length/2 | True if Len is the length of the materialized lazy list. |  |
lazy_list_materialize/1 | Materialize the lazy list. |  |
lazy_message_queue/4 | Lazy list iterator for message queues. |  |
lazy_read_lines/4 | Lazy list iterator to read lines from Stream. |  |
lazy_read_terms/4 | Turn a stream into a lazy list of Prolog terms. |  |
listing.pl -- List programs and pretty print clauses |
listing/0 | Lists all predicates defined in the calling module. |  |
listing/1 | List matching clauses. |  |
listing/2 | List matching clauses. |  |
portray_clause/1 | Portray `Clause' on the current output stream. |  |
portray_clause/2 | Portray `Clause' on the current output stream. |  |
portray_clause/3 | Portray `Clause' on the current output stream. |  |
lists.pl -- List Manipulation |
append/2 | Concatenate a list of lists. |  |
append/3 | List1AndList2 is the concatenation of List1 and List2. |  |
clumped/2 | Pairs is a list of Item-Count pairs that represents the run length encoding of Items. |  |
delete/3 | Delete matching elements from a list. |  |
flatten/2 | Is true if FlatList is a non-nested version of NestedList. |  |
intersection/3 | True if Set3 unifies with the intersection of Set1 and Set2. |  |
is_set/1 | True if Set is a proper list without duplicates. |  |
last/2 | Succeeds when Last is the last element of List. |  |
list_to_set/2 | True when Set has the same elements as List in the same order. |  |
max_list/2 | True if Max is the largest number in List. |  |
max_member/2 | True when Max is the largest member in the standard order of terms. |  |
max_member/3 | True when Max is the largest member according to Pred, which must be a 2-argument callable that behaves like (@=<)/2. |  |
member/2 | True if Elem is a member of List. |  |
min_list/2 | True if Min is the smallest number in List. |  |
min_member/2 | True when Min is the smallest member in the standard order of terms. |  |
min_member/3 | True when Min is the smallest member according to Pred, which must be a 2-argument callable that behaves like (@=<)/2. |  |
nextto/3 | True if Y directly follows X in List. |  |
nth0/3 | True when Elem is the Index'th element of List. |  |
nth0/4 | Select/insert element at index. |  |
nth1/3 | Is true when Elem is the Index'th element of List. |  |
nth1/4 | As nth0/4, but counting starts at 1. |  |
numlist/3 | List is a list [Low, Low+1, ... High]. |  |
permutation/2 | True when Xs is a permutation of Ys. |  |
prefix/2 | True iff Part is a leading substring of Whole. |  |
proper_length/2 | True when Length is the number of elements in the proper list List. |  |
reverse/2 | Is true when the elements of List2 are in reverse order compared to List1. |  |
same_length/2 | Is true when List1 and List2 are lists with the same number of elements. |  |
select/3 | Is true when List1, with Elem removed, results in List2. |  |
select/4 | Select from two lists at the same position. |  |
selectchk/3 | Semi-deterministic removal of first element in List that unifies with Elem. |  |
selectchk/4 | Semi-deterministic version of select/4. |  |
subseq/3 | Is true when SubList contains a subset of the elements of List in the same order and Complement contains all elements of List not in SubList, also in the order they appear in List. |  |
subset/2 | True if all elements of SubSet belong to Set as well. |  |
subtract/3 | Delete all elements in Delete from Set. |  |
sum_list/2 | Sum is the result of adding all numbers in List. |  |
union/3 | True if Set3 unifies with the union of the lists Set1 and Set2. |  |
macros.pl -- Macro expansion |
main.pl -- Provide entry point for scripts |
argv_options/3 | Parse command line arguments. |  |
argv_options/4 | As argv_options/3 in guided mode, Currently this version allows parsing argument options throwing an exception rather than calling halt/1 by passing an empty list to ParseOptions. |  |
argv_usage/1 | Use print_message/2 to print a usage message at Level. |  |
cli_debug_opt_help/2 | Implements opt_type/3, opt_help/2 and opt_meta/2 for debug arguments. |  |
cli_debug_opt_meta/2 | Implements opt_type/3, opt_help/2 and opt_meta/2 for debug arguments. |  |
cli_debug_opt_type/3 | Implements opt_type/3, opt_help/2 and opt_meta/2 for debug arguments. |  |
cli_enable_development_system/0 | Re-enable the development environment. |  |
cli_parse_debug_options/2 | Parse certain commandline options for debugging and development purposes. |  |
main/0 | Call main/1 using the passed command-line arguments. |  |
make.pl -- Reload modified source files |
mallocinfo.pl -- Memory allocation details |
md5.pl -- MD5 hashes |
memfile.pl |
modules.pl -- Module utility predicates |
mqi.pl |
mqi_start/0 | Main entry point for running the Machine Query Interface in "Embedded Mode" and designed to be called from the command line. |  |
mqi_start/1 | Starts a Prolog Machine Query Interface ('MQI') using Options. |  |
mqi_stop/1 | If Server_Thread_ID is a variable, stops all Machine Query Interfaces and associated threads. |  |
mqi_version/2 | Provides the major and minor version number of the protocol used by the MQI. |  |
nb_rbtrees.pl -- Non-backtrackable operations on red black trees |
nb_set.pl -- Non-backtrackable sets |
obfuscate.pl -- Code obfuscating |
occurs.pl -- Finding and counting sub-terms |
odbc.pl |
odbc_current_connection/2 | True if Conn is an open ODBC connection to DSN. |  |
odbc_current_table/2 | Enumerate the existing tables. |  |
odbc_data_source/2 | Enumerate the available data-sources. |  |
odbc_driver_connect/3 | Connects to a database using SQLDriverConnect(). |  |
odbc_query/2 | Execute SQL-statement that does not produce a result. |  |
odbc_query/3 | Run query without options. |  |
odbc_table_column/3 | True if Column appears in Table on Connection. |  |
odbc_table_column/4 | |  |
odbc_table_foreign_key/5 | Enumerate foreign keys columns. |  |
odbc_table_primary_key/3 | Enumerate columns in primary key for table. |  |
odbc_type/3 | |  |
operators.pl -- Manage operators |
option.pl -- Option list processing |
optparse.pl -- command line parsing |
ordsets.pl -- Ordered set manipulation |
oset.pl -- Ordered set manipulation |
pairs.pl -- Operations on key-value lists |
group_pairs_by_key/2 | Group values with equivalent (==/2) consecutive keys. |  |
map_list_to_pairs/3 | Create a Key-Value list by mapping each element of List. |  |
pairs_keys/2 | Remove the values from a list of Key-Value pairs. |  |
pairs_keys_values/3 | True if Keys holds the keys of Pairs and Values the values. |  |
pairs_values/2 | Remove the keys from a list of Key-Value pairs. |  |
transpose_pairs/2 | Swap Key-Value to Value-Key. |  |
paxos.pl -- A Replicated Data Store |
paxos_get/1 | Equivalent to paxos_key(Term,Key) , pasox_get(Key,Term) . |  |
paxos_get/2 | unifies Term with the entry retrieved from the Paxon's ledger. |  |
paxos_get/3 | unifies Term with the entry retrieved from the Paxon's ledger. |  |
paxos_initialize/1 | Initialize this Prolog process as a paxos node. |  |
paxos_ledger_hook/5 | Hook called for all operations on the ledger. |  |
paxos_on_change/2 | Executes the specified Goal when Key changes. |  |
paxos_on_change/3 | Executes the specified Goal when Key changes. |  |
paxos_property/1 | True if Property is a current property for the paxos network. |  |
paxos_quorum_ask/4 | Ask the paxos forum for their opinion. |  |
paxos_replicate_key/3 | Replicate a Key to Nodes. |  |
paxos_set/1 | Equivalent to paxos_key(Term,Key) , pasox_set(Key,Term) . |  |
paxos_set/2 | negotiates to have Key-Value recorded in the ledger for each of the quorum's members. |  |
paxos_set/3 | negotiates to have Key-Value recorded in the ledger for each of the quorum's members. |  |
pcre.pl -- Perl compatible regular expression matching for SWI-Prolog |
pdt_console.pl |
pengines.pl -- Pengines: Web Logic Programming Made Easy |
pengines_io.pl -- Provide Prolog I/O for HTML clients |
binding_term/5 | Hook to render a Prolog result term as HTML. |  |
message_lines_to_html/3 | Helper that translates the Lines argument from user:message_hook/3 into an HTML string. |  |
pengine_bind_io_to_html/1 | Redefine the built-in predicates for IO to send HTML messages using pengine_output/1. |  |
pengine_display/1 | Redirect the corresponding Prolog output predicates. |  |
pengine_flush_output/0 | No-op. |  |
pengine_format/1 | As format/1,2. |  |
pengine_format/2 | As format/1,2. |  |
pengine_io_predicate/1 | True when Head describes the head of a (system) IO predicate that is redefined by the HTML binding. |  |
pengine_listing/0 | List the content of the current pengine or a specified predicate in the pengine. |  |
pengine_listing/1 | List the content of the current pengine or a specified predicate in the pengine. |  |
pengine_nl/0 | Emit a <br/> to the pengine. |  |
pengine_print/1 | Redirect the corresponding Prolog output predicates. |  |
pengine_tab/1 | Emit N spaces. |  |
pengine_write/1 | Redirect the corresponding Prolog output predicates. |  |
pengine_write_canonical/1 | Redirect the corresponding Prolog output predicates. |  |
pengine_write_term/2 | Writes term as <span class=Class>Term</span>. |  |
pengine_writeln/1 | Emit Term as <span class=writeln>Term<br></span>. |  |
pengine_writeq/1 | Redirect the corresponding Prolog output predicates. |  |
send_html/1 | Convert html//1 term into a string and send it to the client using pengine_output/1. |  |
show_html_hook/1 | Hook into help/1 to render the help output in the SWISH console. |  |
message_hook/3 | Send output from print_message/2 to the pengine. |  |
pengines_sandbox.pl -- Declare Pengine interaction sandbox-safe |
persistency.pl -- Provide persistent dynamic predicates |
current_persistent_predicate/1 | True if PI is a predicate that provides access to the persistent database DB. |  |
db_assert/1 | Assert Term into the database and record it for persistency. |  |
db_attach/2 | Use File as persistent database for the calling module. |  |
db_attached/1 | True if the context module attached to the persistent database File. |  |
db_detach/0 | Detach persistency from the calling module and delete all persistent clauses from the Prolog database. |  |
db_retract/1 | Retract terms from the database one-by-one. |  |
db_retractall/1 | Retract all matching facts and do the same in the database. |  |
db_sync/1 | Synchronise database with the associated file. |  |
db_sync_all/1 | Sync all registered databases. |  |
persistent/1 | Declare dynamic database terms. |  |
pio.pl -- Pure I/O |
pldoc.pl -- Process source documentation |
plunit.pl -- Unit Testing |
begin_tests/1 | Start a test-unit. |  |
begin_tests/2 | Start a test-unit. |  |
current_test/5 | True when a test with the specified properties is loaded. |  |
current_test_unit/2 | True when a Unit is a current unit test declared with Options. |  |
end_tests/1 | Close a unit-test module. |  |
load_test_files/1 | Load .plt test-files related to loaded source-files. |  |
run_tests/0 | Run tests and report about the results. |  |
run_tests/1 | Run tests and report about the results. |  |
run_tests/2 | Run tests and report about the results. |  |
running_tests/0 | Print the currently running test. |  |
set_test_options/1 | Specifies how to deal with test suites. |  |
test_report/1 | Produce reports on test results after the run. |  |
unit_module/2 | |  |
message_hook/3 | Redefine printing some messages. |  |
porter_stem.pl |
portray_text.pl -- Portray text |
pprint.pl -- Pretty Print Prolog terms |
predicate_options.pl -- Access and analyse predicate options |
process.pl -- Create processes and redirect I/O |
prolog_autoload.pl -- Autoload all dependencies |
prolog_breakpoints.pl -- Manage Prolog break-points |
prolog_clause.pl -- Get detailed source-information about a clause |
clause_info/4 | Fetches source information for the given clause. |  |
clause_info/5 | Fetches source information for the given clause. |  |
clause_name/2 | Provide a suitable description of the indicated clause. |  |
initialization_layout/4 | Find term-layout of :- initialization directives. |  |
make_varnames/5 | Create a Term varnames(...) where each argument contains the name of the variable at that offset. |  |
open_source/2 | Hook into clause_info/5 that opens the stream holding the source for a specific clause. |  |
predicate_name/2 | Describe a predicate as [Module:]Name/Arity. |  |
unify_goal/5 | This hook is called to fix up source code manipulations that result from goal expansions. |  |
unify_term/2 | Unify the two terms, where T2 is created by writing the term and reading it back in, but be aware that rounding problems may cause floating point numbers not to unify. |  |
prolog_code.pl -- Utilities for reasoning about code |
body_term_calls/2 | True when BodyTerm calls Goal. |  |
comma_list/2 | True if CommaList is a nested term over the ','/2 (';'/2) functor and List is a list expressing the elements of the conjunction. |  |
extend_goal/3 | Extend the possibly qualified Goal0 with additional arguments from Extra. |  |
head_name_arity/3 | Similar to functor/3, but deals with SWI-Prolog's zero-argument callable terms and avoids creating a non-callable term if Name is not an atom and Arity is zero. |  |
is_control_goal/1 | True if Goal is a compiled Prolog control structure. |  |
is_predicate_indicator/1 | True when Term is a predicate indicator. |  |
mkconj/3 | Create a conjunction or disjunction from two terms. |  |
mkdisj/3 | Create a conjunction or disjunction from two terms. |  |
most_general_goal/2 | General is the most general version of Goal. |  |
pi_head/2 | Translate between a PredicateIndicator and a Goal term. |  |
predicate_label/2 | Create a human-readable label for the given predicate indicator. |  |
predicate_sort_key/2 | Key is the (module-free) name of the predicate for sorting purposes. |  |
semicolon_list/2 | True if CommaList is a nested term over the ','/2 (';'/2) functor and List is a list expressing the elements of the conjunction. |  |
prolog_codewalk.pl -- Prolog code walker |
prolog_program_clause/2 | True when ClauseRef is a reference for clause in the program. |  |
prolog_walk_code/1 | Walk over all loaded (user) Prolog code. |  |
subterm_pos/5 | True when SubTerm is a sub term of Term, compared using Cmp, TermPosition describes the term layout of Term and SubTermPos describes the term layout of SubTerm. |  |
prolog_colour.pl -- Prolog syntax colouring support. |
prolog_config.pl -- Provide configuration information |
apple_bundle_libdir/1 | If we are part of a MacOS bundle the C libraries are in the bundle Frameworks directory and the executable is in the bundle MacOS directory. |  |
prolog_dump_runtime_variables/0 | Dump the current configuration in shell format. |  |
prolog_debug.pl -- User level debugging tools |
prolog_deps.pl -- Compute file dependencies |
prolog_evaluable.pl -- Inspect properties of evaluable functions |
evaluable_property/2 | True when Property is a property of the evaluable function Function. |  |
prolog_format.pl -- Analyse format specifications |
prolog_history.pl -- Per-directory persistent commandline history |
prolog_history/1 | Execute Action on the history. |  |
prolog_install.pl -- Installation support predicates |
cmake_qcompile/2 | Qcompile on behalf of CMAKE installation. |  |
cmake_save_man_index/0 | Create swi('doc/manindex.db') during the build process. |  |
qcompile_libraries/0 | Quick-load compilation of the Prolog libraries. |  |
prolog_jiti.pl -- Just In Time Indexing (JITI) utilities |
prolog_metainference.pl -- Infer meta-predicate properties |
prolog_pack.pl -- A package manager for Prolog |
pack_attach/2 | Attach a single package in Dir. |  |
pack_info/1 | Print more detailed information about Pack. |  |
pack_install/1 | Install a package. |  |
pack_install/2 | Install package Name. |  |
pack_list/1 | Query package server and installed packages and display results. |  |
pack_list_installed/0 | List currently installed packages. |  |
pack_property/2 | True when Property is a property of an installed Pack. |  |
pack_rebuild/0 | Rebuild foreign components of all packages. |  |
pack_rebuild/1 | Rebuild possible foreign components of Pack. |  |
pack_remove/1 | Remove the indicated package. |  |
pack_search/1 | Query package server and installed packages and display results. |  |
pack_upgrade/1 | Try to upgrade the package Pack. |  |
pack_url_file/2 | True if File is a unique id for the referenced pack and version. |  |
prolog_profile.pl -- Execution profiler |
prolog_server.pl |
prolog_source.pl -- Examine Prolog source-files |
prolog_stack.pl -- Examine the Prolog stack |
backtrace/1 | Get and print a stacktrace to the user_error stream. |  |
get_prolog_backtrace/2 | Obtain a backtrace from the current location. |  |
get_prolog_backtrace/3 | Obtain a backtrace from the current location. |  |
print_last_choicepoint/0 | Print details on the last open choice point. |  |
print_last_choicepoint/2 | |  |
print_prolog_backtrace/2 | Print a stacktrace in human readable form to Stream. |  |
print_prolog_backtrace/3 | Print a stacktrace in human readable form to Stream. |  |
prolog_stack_frame_property/2 | True when Property is a property of Frame. |  |
stack_guard/1 | Dynamic multifile hook that is normally not defined. |  |
stack_guard/1 | Dynamic multifile predicate. |  |
prolog_stream.pl -- A stream with Prolog callbacks |
prolog_trace.pl -- Print access to predicates |
list_tracing/0 | List predicates we are currently tracing. |  |
notraceall/0 | Remove all trace points. |  |
trace/1 | Print passes through ports of specified predicates. |  |
trace/2 | Print passes through ports of specified predicates. |  |
tracing/2 | True if Spec is traced using Ports. |  |
prolog_versions.pl -- Demand specific Prolog versions |
prolog_wrap.pl -- Wrapping predicates |
current_predicate_wrapper/4 | True if Head is wrapped with Body. |  |
unwrap_predicate/2 | Remove the outermost wrapper whose name unifies with Name. | |
wrap_predicate/4 | Wrap the predicate referenced by Head using Body. |  |
prolog_xref.pl -- Prolog cross-referencer data collection |
protobufs.pl -- Google's Protocol Buffers ("protobufs") |
pure_input.pl -- Pure Input from files and streams |
lazy_list_character_count/3 | True when CharCount is the current character count in the Lazy list. |  |
lazy_list_location/3 | Determine current (error) location in a lazy list. |  |
phrase_from_file/2 | Process the content of File using the DCG rule Grammar. |  |
phrase_from_file/3 | As phrase_from_file/2, providing additional Options. |  |
phrase_from_stream/2 | Run Grammer against the character codes on Stream. |  |
stream_to_lazy_list/2 | Create a lazy list representing the character codes in Stream. |  |
syntax_error/3 | Throw the syntax error Error at the current location of the input. |  |
pwp.pl -- Prolog Well-formed Pages |
pwp_files/2 | loads an Xml document from the file named In, transforms it using the PWP attributes, and writes the transformed version to the new file named Out. |  |
pwp_stream/3 | Loads an Xml document from the given Input stream, transforms it using the PWP attributes, and writes the transformed version to the given Output stream. |  |
pwp_xml/3 | maps down a list of XML items, acting specially on elements and copying everything else unchanged, including white space. |  |
qpforeign.pl -- Quintus compatible foreign loader |
qsave.pl -- Save current program as a state or executable |
quasi_quotations.pl -- Define Quasi Quotation syntax |
quintus.pl -- Quintus compatibility |
random.pl -- Random numbers |
getrand/1 | Query/set the state of the random generator. |  |
maybe/0 | Succeed/fail with equal probability (variant of maybe/1). |  |
maybe/1 | Succeed with probability P, fail with probability 1-P. |  |
maybe/2 | Succeed with probability K/N (variant of maybe/1). |  |
random/1 | Binds R to a new random float in the open interval (0.0,1.0). |  |
random/3 | Generate a random integer or float in a range. |  |
random_between/3 | Binds R to a random integer in [L,U] (i.e., including both L and U). |  |
random_member/2 | X is a random member of List. |  |
random_numlist/4 | Unify List with an ascending list of integers between L and U (inclusive). |  |
random_perm2/4 | Does X=A,Y=B or X=B,Y=A with equal probability. |  |
random_permutation/2 | Permutation is a random permutation of List. |  |
random_select/3 | Randomly select or insert an element. |  |
random_subseq/3 | Selects a random subsequence Subseq of List, with Complement containing all elements of List that were not selected. |  |
randseq/3 | S is a list of K unique random integers in the range 1..N. |  |
randset/3 | S is a sorted list of K unique random integers in the range 1..N. |  |
setrand/1 | Query/set the state of the random generator. |  |
rbtrees.pl -- Red black trees |
rdf.pl -- RDF/XML parser |
rdf_diagram.pl -- Show graphical representation of a set of triples |
rdf_parser.pl |
rdf_triple.pl -- Create triples from intermediate representation |
anon_prefix/1 | If defined, it is the prefix used to generate a blank node. |  |
rdf_end_file/1 | Cleanup reaching the end of an RDF file. |  |
rdf_reset_ids/0 | Utility predicate to reset the gensym counters for the various generated identifiers. |  |
rdf_start_file/2 | Initialise for the translation of a file. |  |
rdf_triples/2 | Convert an object as parsed by rdf.pl into a list of rdf/3 triples. |  |
rdf_triples/3 | Convert an object as parsed by rdf.pl into a list of rdf/3 triples. |  |
rdf_write.pl -- Write RDF/XML from a list of triples |
rdf_write_xml/2 | Write an RDF/XML serialization of Triples to Out. |  |
readline.pl -- GNU readline interface |
readln.pl -- Read line as list of tokens |
readutil.pl -- Read utilities |
record.pl -- Access compound arguments by name |
redis.pl -- Redis client |
redis/1 | Connect to the default redis server, call redist/3 using Request, disconnect and print the result. |  |
redis/2 | This predicate is overloaded to handle two types of requests. |  |
redis/3 | Execute a redis Command on Connnection. |  |
redis_array_dict/3 | Translate a Redis reply representing hash data into a SWI-Prolog dict. |  |
redis_connect/1 | Connect to a redis server. |  |
redis_connect/3 | Connect to a redis server. |  |
redis_current_command/2 | True when Command has Properties. |  |
redis_current_command/3 | True when Command has Properties. |  |
redis_current_subscription/2 | True when a PUB/SUB subscription with Id is listening on Channels. |  |
redis_disconnect/1 | Disconnect from a redis server. |  |
redis_disconnect/2 | Disconnect from a redis server. |  |
redis_get_hash/3 | Put/get a Redis hash as a Prolog dict. |  |
redis_get_list/3 | Get the content of a Redis list in List. |  |
redis_get_list/4 | Get the content of a Redis list in List. |  |
redis_hscan/4 | Map the Redis SCAN , SSCAN , HSCAN and ZSCAN` commands into a lazy list. |  |
redis_property/2 | True if Property is a property of the Redis server. |  |
redis_read/2 | Write command and read replies from a Redis server. |  |
redis_scan/3 | Map the Redis SCAN , SSCAN , HSCAN and ZSCAN` commands into a lazy list. |  |
redis_server/3 | Register a redis server without connecting to it. |  |
redis_set_hash/3 | Put/get a Redis hash as a Prolog dict. |  |
redis_set_list/3 | Associate a Redis key with a list. |  |
redis_sscan/4 | Map the Redis SCAN , SSCAN , HSCAN and ZSCAN` commands into a lazy list. |  |
redis_subscribe/2 | Add/remove channels from for the subscription. |  |
redis_subscribe/4 | Subscribe to one or more Redis PUB/SUB channels. |  |
redis_unsubscribe/2 | Add/remove channels from for the subscription. |  |
redis_write/2 | Write command and read replies from a Redis server. |  |
redis_zscan/4 | Map the Redis SCAN , SSCAN , HSCAN and ZSCAN` commands into a lazy list. |  |
tls_verify/5 | Accept or reject the certificate verification. |  |
redis_streams.pl -- Using Redis streams |
rewrite_term.pl |
rlimit.pl |
rwlocks.pl -- Read/write locks |
saml.pl -- SAML Authentication |
sandbox.pl -- Sandboxed Prolog code |
sched.pl -- Access process scheduling |
settings.pl -- Setting management |
sgml.pl -- SGML, XML and HTML parser |
dtd/2 | DTD is a DTD object created from the file dtd(Type) . |  |
load_dtd/3 | Load DtdFile into a DTD. |  |
load_html/3 | Load HTML text from Input and unify the resulting DOM structure with DOM. |  |
load_html_file/2 | Load HTML from File and unify the resulting DOM structure with DOM. |  |
load_sgml/3 | Load SGML text from Input and unify the resulting DOM structure with DOM. |  |
load_sgml_file/2 | Load SGML from File and unify the resulting DOM structure with DOM. |  |
load_structure/3 | Parse Source and return the resulting structure in ListOfContent. |  |
load_xml/3 | Load XML text from Input and unify the resulting DOM structure with DOM. |  |
load_xml_file/2 | Load XML from File and unify the resulting DOM structure with DOM. |  |
xml_basechar/1 | XML character classification predicates. |  |
xml_combining_char/1 | XML character classification predicates. |  |
xml_digit/1 | XML character classification predicates. |  |
xml_extender/1 | XML character classification predicates. |  |
xml_ideographic/1 | XML character classification predicates. |  |
xml_is_dom/1 | True if term statisfies the structure as returned by load_structure/3 and friends. |  |
xml_name/1 | True if Atom is a valid XML name. |  |
xml_quote_attribute/2 | Backward compatibility for versions that allow to specify encoding. |  |
xml_quote_cdata/2 | Backward compatibility for versions that allow to specify encoding. |  |
sgml_write.pl -- XML/SGML writer module |
html_write/2 | Write a term as created by the SGML/XML parser to a stream in SGML or XML format. |  |
html_write/3 | Write a term as created by the SGML/XML parser to a stream in SGML or XML format. |  |
sgml_write/2 | Write a term as created by the SGML/XML parser to a stream in SGML or XML format. |  |
sgml_write/3 | Write a term as created by the SGML/XML parser to a stream in SGML or XML format. |  |
xml_write/2 | Write a term as created by the SGML/XML parser to a stream in SGML or XML format. |  |
xml_write/3 | Write a term as created by the SGML/XML parser to a stream in SGML or XML format. |  |
xmlns/2 | Hook to define human readable abbreviations for XML namespaces. |  |
sha.pl -- SHA secure hashes |
file_sha1/2 | True when SHA1 is the SHA1 hash for the content of File. |  |
hash_atom/2 | Convert a list of bytes (integers 0..255) into the usual hexadecimal notation. |  |
hmac_sha/4 | For Options, see sha_hash/3. |  |
sha_hash/3 | Hash is the SHA hash of Data, The conversion is controlled by Options:. |  |
sha_hash_ctx/4 | Hash is the SHA hash of Data. |  |
sha_new_ctx/2 | NewContext is unified with the empty SHA computation context (which includes the Options.) It could later be passed to sha_hash_ctx/4. |  |
shell.pl -- Elementary shell commands |
shlib.pl -- Utility library for loading foreign objects (DLLs, shared objects) |
compat_arch/2 | User definable hook to establish if Arch1 is compatible with Arch2 when running a shared object. |  |
current_foreign_library/2 | Query currently loaded shared libraries. |  |
load_foreign_library/1 | Load a shared object or DLL. |  |
load_foreign_library/2 | Load a shared object or DLL. |  |
reload_foreign_libraries/0 | Reload all foreign libraries loaded (after restore of a state created using qsave_program/2. |  |
unload_foreign_library/1 | Unload a shared object or DLL. |  |
unload_foreign_library/2 | Unload a shared object or DLL. |  |
use_foreign_library/1 | Load and install a foreign library as load_foreign_library/1,2 and register the installation using initialization/2 with the option now . |  |
use_foreign_library/2 | Load and install a foreign library as load_foreign_library/1,2 and register the installation using initialization/2 with the option now . |  |
snowball.pl -- The Snowball multi-lingual stemmer library |
socket.pl -- Network socket (TCP and UDP) library |
gethostname/1 | Return the canonical fully qualified name of this host. |  |
host_address/3 | Translate between a machines host-name and it's (IP-)address. |  |
ip_name/2 | Translate between the textual representation of an IP address and the Prolog data structure. |  |
negotiate_socks_connection/2 | Negotiate a connection to DesiredEndpoint over StreamPair. |  |
proxy_for_url/3 | This hook can be implemented to return a proxy to try when connecting to URL. |  |
rewrite_host/3 | Allow rewriting the host for tcp_connect/2 and therefore all other predicates to connect a socket. |  |
socket_create/2 | Create a socket according to Options. |  |
tcp_accept/3 | This predicate waits on a server socket for a connection request by a client. |  |
tcp_bind/2 | Bind the socket to Address on the current machine. |  |
tcp_close_socket/1 | Closes the indicated socket, making SocketId invalid. |  |
tcp_connect/2 | Connect SocketId. |  |
tcp_connect/3 | Establish a TCP communication as a client. |  |
tcp_connect/4 | Connect a (client) socket to Address and return a bi-directional connection through the stream-handles Read and Write. |  |
tcp_fcntl/3 | Interface to the fcntl() call. |  |
tcp_getopt/2 | Get information about Socket. |  |
tcp_host_to_address/2 | Translate between a machines host-name and it's (IP-)address. |  |
tcp_listen/2 | Tells, after tcp_bind/2, the socket to listen for incoming requests for connections. |  |
tcp_open_socket/2 | Create streams to communicate to SocketId. |  |
tcp_open_socket/3 | Similar to tcp_open_socket/2, but creates two separate sockets where tcp_open_socket/2 would have created a stream pair. |  |
tcp_select/3 | Same as the built-in wait_for_input/3. |  |
tcp_setopt/2 | Set options on the socket. |  |
tcp_socket/1 | Equivalent to socket_create(SocketId, []) or, explicit, socket_create(SocketId, [domain(inet), type(stream)]) . |  |
try_proxy/4 | Attempt a socket-level connection via the given proxy to TargetAddress. |  |
udp_receive/4 | Wait for and return the next datagram. |  |
udp_send/4 | Send a UDP message. |  |
udp_socket/1 | Equivalent to socket_create(SocketId, [type(dgram)]) or, explicit, socket_create(SocketId, [domain(inet), type(dgram)]) . |  |
unix_domain_socket/1 | Equivalent to socket_create(SocketId, [domain(unix)]) or, explicit, socket_create(SocketId, [domain(unix), type(stream)]) . |  |
solution_sequences.pl -- Modify solution sequences |
sort.pl |
locale_sort/2 | Sort a list of atoms using the current locale. |  |
predsort/3 | Sorts similar to sort/2, but determines the order of two terms by calling Compare(-Delta, +E1, +E2). |  |
ssl.pl -- Secure Socket Layer (SSL) library |
statistics.pl -- Get information about resource usage |
stomp.pl -- STOMP client. |
streaminfo.pl |
stream_info/1 | Print detailed information about a stream or a file-number to the error output. |  |
streampool.pl -- Input multiplexing |
streams.pl -- Manage Prolog streams |
strings.pl -- String utilities |
sweep_link.pl -- Information for dynamically linking to GNU Emacs |
syslog.pl -- Unix syslog interface |
system.pl -- System utilities |
table.pl |
table_util.pl -- Tabular file handling utilities |
tables.pl -- XSB interface to tables |
term_to_json.pl |
term_to_json/2 | Convert any general Prolog term into a JSON term. |  |
term_to_json/3 | Convert any general Prolog term into a JSON term. |  |
terms.pl -- Term manipulation |
test_cover.pl -- Clause coverage analysis |
test_wizard.pl -- Test Generation Wizard |
thread.pl -- High level thread primitives |
thread_pool.pl -- Resource bounded thread management |
threadutil.pl -- Interactive thread utilities |
time.pl -- Time and alarm library |
tty.pl -- Terminal operations |
udp_broadcast.pl -- A UDP broadcast proxy |
udp_broadcast_close/1 | Close a UDP broadcast scope. |  |
udp_broadcast_initialize/2 | Initialized UDP broadcast bridge. |  |
udp_peer/2 | Manage and query the set of known peers for a unicast network. |  |
udp_peer_add/2 | Manage and query the set of known peers for a unicast network. |  |
udp_peer_del/2 | Manage and query the set of known peers for a unicast network. |  |
udp_term_string_hook/3 | Hook for serializing the message Term. |  |
udp_unicast_join_hook/3 | This multifile hook is called if an UDP package is received on the port of the unicast network identified by Scope. |  |
ugraphs.pl -- Graph manipulation library |
uid.pl -- User and group management on Unix systems |
unicode.pl -- Unicode string handling |
unix.pl -- Unix specific operations |
uri.pl -- Process URIs |
url.pl -- Analysing and constructing URL |
utf8.pl -- UTF-8 encoding/decoding on lists of character codes. |
uuid.pl -- Universally Unique Identifier (UUID) Library |
varnumbers.pl -- Utilities for numbered terms |
vm.pl -- SWI-Prolog Virtual Machine utilities |
wfs.pl -- Well Founded Semantics interface |
answer_residual/2 | True when Goal resolves to a tabled predicate and Residual is the residual goal associated with an answer for Goal. |  |
call_delays/2 | True when Goal is true with Delays. |  |
call_residual_program/2 | Call Goal and return the full residual program as a list of Clauses. |  |
delays_residual_program/2 | Given a delay as returned by call_delays/2, produce a set of clauses the represents the complete residual program responsible for these delays, The program contains at least one loop through tnot/1 and is either inconsistent or has multiple models according to the stable model semantics. |  |
when.pl -- Conditional coroutining |
writef.pl -- Old-style formatted write |
swritef/2 | Use writef/1 or writef/2 and write the result to a string. |  |
swritef/3 | Use writef/1 or writef/2 and write the result to a string. |  |
writef/1 | Formatted write to the current_output . |  |
writef/2 | Formatted write to the current_output . |  |
www_browser.pl -- Open a URL in the users browser |
expand_url_path/2 | Expand URL specifications similar to absolute_file_name/3. |  |
known_browser/2 | True if browser FileBaseName has a remote protocol compatible to Compatible. |  |
www_open_url/1 | Open URL in running version of the users' browser or start a new browser. |  |
xmldsig.pl -- XML Digital signature |
xmlenc.pl -- XML encryption library |
decrypt_xml/4 | |  |
load_certificate_from_base64_string/2 | Loads a certificate from a string, adding newlines and header where appropriate so that OpenSSL 1.0.1+ will be able to parse it. |  |
xpath.pl -- Select nodes in an XML DOM |
xsdp_types.pl -- XML-Schema primitive types |
yall.pl -- Lambda expressions |
//2 | Shorthand for Free/[]>>Lambda . |  |
//3 | Shorthand for Free/[]>>Lambda . |  |
//4 | Shorthand for Free/[]>>Lambda . |  |
//5 | Shorthand for Free/[]>>Lambda . |  |
//6 | Shorthand for Free/[]>>Lambda . |  |
//7 | Shorthand for Free/[]>>Lambda . |  |
//8 | Shorthand for Free/[]>>Lambda . |  |
//9 | Shorthand for Free/[]>>Lambda . |  |
>>/2 | Calls a copy of Lambda. |  |
>>/3 | Calls a copy of Lambda. |  |
>>/4 | Calls a copy of Lambda. |  |
>>/5 | Calls a copy of Lambda. |  |
>>/6 | Calls a copy of Lambda. |  |
>>/7 | Calls a copy of Lambda. |  |
>>/8 | Calls a copy of Lambda. |  |
>>/9 | Calls a copy of Lambda. |  |
is_lambda/1 | True if Term is a valid Lambda expression. |  |
lambda_calls/2 | Goal is the goal called if call/N is applied to LambdaExpression, where ExtraArgs are the additional arguments to call/N. |  |
lambda_calls/3 | Goal is the goal called if call/N is applied to LambdaExpression, where ExtraArgs are the additional arguments to call/N. |  |
yaml.pl -- Process YAML data |
zip.pl -- Access resource ZIP archives |
zlib.pl -- Zlib wrapper for SWI-Prolog |