Did you know ... Search Documentation:
Title for pldoc(dir_index)

library

Prolog files

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