/* Generated by online_index/0 Purpose: Index to file online_manual */ :- module(help_index, [ predicate/5, section/4, function/3 ]). % Predicate predicate/5 predicate(~,0,'',41,48). predicate(help,0,'Give help on help',736,738). predicate(help,1,'Give help on predicates and show parts of manual',740,764). predicate(apropos,1,'library(online_help) Search manual',766,775). predicate(explain,1,'library(explain) Explain argument',777,783). predicate(explain,2,'library(explain) 2nd argument is explanation of first',785,788). predicate(current_prolog_flag,2,'Get system configuration parameters',1233,1927). predicate(set_prolog_flag,2,'Define a system feature',1929,1951). predicate(create_prolog_flag,3,'Create a new Prolog flag',1953,1972). predicate(autoload_path,1,'Add directories for autoloading',2101,2113). predicate(make_library_index,1,'Create autoload file INDEX.pl',2115,2119). predicate(make_library_index,2,'Create selective autoload file INDEX.pl',2121,2141). predicate(reload_library_index,0,'Force reloading the autoload index',2143,2159). predicate(guitracer,0,'Install hooks for the graphical debugger',3536,3542). predicate(noguitracer,0,'Disable the graphical debugger',3544,3547). predicate(gtrace,0,'Trace using graphical tracer',3549,3551). predicate(gdebug,0,'Debug using graphical tracer',3553,3555). predicate(gspy,1,'Spy using graphical tracer',3557,3559). predicate(gxref,0,'Cross-reference loaded program',3593,3650). predicate(prolog_ide,1,'Program access to the development environment',3662,3689). predicate(load_files,2,'Load source files with options',3936,4094). predicate(consult,1,'Read (compile) a Prolog source file',4096,4108). predicate(ensure_loaded,1,'Consult a file if that has not yet been done',4110,4122). predicate(include,1,'Include a file with declarations',4124,4173). predicate(require,1,'This file requires these predicates',4175,4190). predicate(encoding,1,'Define encoding inside a source file',4192,4197). predicate(make,0,'Reconsult all changed source files',4199,4210). predicate(library_directory,1,'Hook (user) Directories holding Prolog libraries',4212,4218). predicate(file_search_path,2,'Define path-aliases for locating files',4220,4262). predicate(expand_file_search_path,2,'Wildcard expansion of file paths',4264,4267). predicate(prolog_file_type,2,'Define meaning of file extension',4269,4291). predicate(source_file,1,'Examine currently loaded source files',4293,4296). predicate(source_file,2,'Obtain source file of predicate',4298,4306). predicate(source_file_property,2,'Information about loaded files',4308,4347). predicate(unload_file,1,'Unload a source file',4349,4360). predicate(prolog_load_context,2,'Context information for directives',4362,4406). predicate(source_location,2,'Location of last read term',4408,4413). predicate(at_halt,1,'Register goal to run at halt/1',4415,4424). predicate(cancel_halt,1,'Cancel halt/0 from an at_halt/1 hook',4426,4432). predicate(initialization,1,'Initialization directive',4434,4466). predicate(initialization,2,'Initialization directive',4468,4482). predicate(compiling,0,'Is this a compilation run?',4484,4489). predicate(term_expansion,2,'Hook (user) Convert term before compilation',4506,4527). predicate(expand_term,2,'Compiler: expand read term into clause(s)',4529,4545). predicate(goal_expansion,2,'Hook for macro-expanding goals',4547,4564). predicate(expand_goal,2,'Compiler: expand goal in clause-body',4566,4573). predicate(compile_aux_clauses,1,'Compile predicates for goal_expansion/2',4575,4580). predicate(dcg_translate_rule,2,'Source translation of DCG rules',4582,4586). predicate(expand_goal,4,'Compiler: expand goal in clause-body',4602,4603). predicate(goal_expansion,4,'Hook for macro-expanding goals',4605,4606). predicate(expand_term,4,'Compiler: expand read term into clause(s)',4608,4609). predicate(term_expansion,4,'Hook (user) Convert term before compilation',4611,4612). predicate(dcg_translate_rule,4,'Source translation of DCG rules',4614,4619). predicate(if,1,'Start conditional compilation (directive)',4652,4657). predicate(elif,1,'Part of conditional compilation (directive)',4659,4675). predicate(else,0,'Part of conditional compilation (directive)',4677,4679). predicate(endif,0,'End of conditional compilation (directive)',4681,4683). predicate(garbage_collect_clauses,0,'Invoke clause garbage collector',4709,4717). predicate(qcompile,1,'Compile source to Quick Load File',4823,4843). predicate(qcompile,2,'Compile source to Quick Load File',4845,4848). predicate(edit,1,'Edit a file, predicate, module (extensible)',4875,4882). predicate(edit,0,'Edit current script- or associated file',4884,4888). predicate(locate,3,'Locate targets for edit/1',4897,4910). predicate(locate,2,'Locate targets for edit/1',4912,4915). predicate(edit_source,1,'Call editor for edit/1',4917,4934). predicate(edit_command,2,'Specify editor activation',4936,4961). predicate(load,0,'Load edit/1 extensions',4963,4976). predicate(listing,1,'List predicate',4981,4992). predicate(listing,0,'List program in current module',4994,4998). predicate(portray_clause,1,'Pretty print a clause',5000,5005). predicate(portray_clause,2,'Pretty print a clause to a stream',5007,5009). predicate(var,1,'Type check for unbound variable',5019,5021). predicate(nonvar,1,'Type check for bound term',5023,5025). predicate(integer,1,'Type check for integer',5027,5029). predicate(float,1,'Type check for a floating point number',5031,5033). predicate(rational,1,'Type check for a rational number',5035,5038). predicate(rational,3,'Decompose a rational',5040,5045). predicate(number,1,'Type check for integer or float',5047,5049). predicate(atom,1,'Type check for an atom',5051,5053). predicate(blob,2,'Type check for a blob',5055,5057). predicate(string,1,'Type check for string',5059,5076). predicate(atomic,1,'Type check for primitive',5078,5083). predicate(compound,1,'Test for compound term',5085,5088). predicate(callable,1,'Test for atom or compound term',5090,5109). predicate(ground,1,'Verify term holds no unbound variables',5111,5113). predicate(cyclic_term,1,'Test term for cycles',5115,5118). predicate(acyclic_term,1,'Test term for cycles',5120,5124). predicate(=,2,'Unification',5132,5139). predicate(\=,2,'Not unifiable',5141,5143). predicate(==,2,'Identical',5169,5172). predicate(\==,2,'Not identical',5174,5176). predicate(@<,2,'Standard order smaller',5178,5180). predicate(@=<,2,'Standard order smaller or equal',5182,5185). predicate(@>,2,'Standard order larger',5187,5189). predicate(@>=,2,'Standard order larger or equal',5191,5194). predicate(compare,3,'Compare, using a predicate to determine the order',5196,5199). predicate(unify_with_occurs_check,2,'Logically sound unification',5212,5249). predicate(=@=,2,'Structural identical',5251,5292). predicate(\=@=,2,'Not structural identical',5294,5296). predicate(subsumes_term,2,'One-sided unification test',5298,5304). predicate(term_subsumer,3,'Most specific generalization of two terms',5306,5309). predicate(unifiable,3,'Determining binding required for unification',5311,5316). predicate(?=,2,'Test of terms can be compared now',5318,5323). predicate(fail,0,'Always false',5341,5344). predicate(false,0,'Always false',5346,5348). predicate(true,0,'Succeed',5350,5353). predicate(repeat,0,'Succeed, leaving infinite backtrack points',5355,5357). predicate(!,0,'Cut (discard choicepoints)',5359,5378). predicate(',',2,'Conjunction of goals',5380,5387). predicate(;,2,'Disjunction of goals. Same as |/2',5389,5395). predicate('|',2,'Disjunction of goals. Same as ;/2',5397,5400). predicate(->,2,'If-then-else',5402,5419). predicate(*->,2,'Soft-cut',5421,5431). predicate(\+,1,'Negation by failure. Same as not/1',5433,5437). predicate(call,1,'Call a goal',5449,5452). predicate(call,_G47,'Call with additional arguments',5454,5465). predicate(apply,2,'Call goal with additional arguments',5467,5472). predicate(not,1,'Negation by failure (argument not provable). Same as \\+/1',5474,5477). predicate(once,1,'Call a goal deterministically',5479,5493). predicate(ignore,1,'Call the argument, but always succeed',5495,5503). predicate(call_with_depth_limit,3,'Prove goal with bounded depth',5505,5533). predicate(setup_call_cleanup,3,'Undo side-effects safely',5535,5590). predicate(setup_call_catcher_cleanup,4,'Undo side-effects safely',5592,5623). predicate(call_cleanup,2,'Guard a goal with a cleaup-handler',5625,5632). predicate(call_cleanup,3,'Guard a goal with a cleaup-handler',5634,5637). predicate(catch,3,'Call goal, watching for exceptions',5649,5660). predicate(throw,1,'Raise an exception (see catch/3)',5662,5681). predicate(print_message,2,'Print message from (exception) term',5761,5826). predicate(print_message_lines,3,'Print message to stream',5828,5869). predicate(message_hook,3,'Intercept print_message/2',5871,5879). predicate(thread_message_hook,3,'Thread local message_hook/3',5881,5887). predicate(message_property,2,'Hook (user) Define display of a message',5889,5925). predicate(message_line_element,2,'Hook (prolog) Intercept print_message_lines/3',5927,5931). predicate(message_to_string,2,'Translate message-term to string',5933,5935). predicate(version,0,'Print system banner message',5937,5941). predicate(version,1,'Add messages to the system banner',5943,5948). predicate(on_signal,3,'Handle a software signal',6035,6069). predicate(current_signal,3,'Current software signal mapping',6071,6075). predicate(phrase,2,'Activate grammar-rule set',6158,6160). predicate(phrase,3,'Activate grammar-rule set (returning rest)',6162,6208). predicate(abolish,1,'Remove predicate definition from the database',6239,6255). predicate(abolish,2,'Remove predicate definition from the database',6257,6260). predicate(copy_predicate_clauses,2,'Copy clauses between predicates',6262,6285). predicate(redefine_system_predicate,1,'Abolish system definition',6287,6297). predicate(retract,1,'Remove clause from the database',6299,6303). predicate(retractall,1,'Remove unifying clauses from the database',6305,6310). predicate(asserta,1,'Add a clause to the database (first)',6312,6317). predicate(assertz,1,'Add a clause to the database (last)',6319,6322). predicate(assert,1,'Add a clause to the database',6324,6327). predicate(asserta,2,'Add a clause to the database (first)',6329,6333). predicate(assertz,2,'Add a clause to the database (last)',6335,6338). predicate(assert,2,'Add a clause to the database, give reference',6340,6343). predicate(recorda,3,'Record term in the database (first)',6345,6351). predicate(recorda,2,'Record term in the database (first)',6353,6355). predicate(recordz,3,'Record term in the database (last)',6357,6360). predicate(recordz,2,'Record term in the database (last)',6362,6364). predicate(recorded,3,'Obtain term from the database',6366,6377). predicate(recorded,2,'Obtain term from the database',6379,6381). predicate(erase,1,'Erase a database record or clause',6383,6388). predicate(instance,2,'Fetch clause or record from reference',6390,6393). predicate(flag,3,'Simple global variable system',6395,6405). predicate(term_hash,2,'Hash-value of ground term',6441,6456). predicate(term_hash,4,'Hash-value of term with depth limit',6458,6467). predicate(variant_sha1,2,'Term-hash for term-variants',6469,6488). predicate(dynamic,1,'Indicate predicate definition may change',6509,6517). predicate(compile_predicates,1,'Compile dynamic code to static',6519,6527). predicate(multifile,1,'Indicate distributed definition of predicate',6529,6533). predicate(discontiguous,1,'Indicate distributed definition of a predicate',6535,6538). predicate(public,1,'Declaration that a predicate may be called',6540,6549). predicate(current_atom,1,'Examine existing atoms',6554,6558). predicate(current_blob,2,'Examine typed blobs',6560,6565). predicate(current_functor,2,'Examine existing name/arity pairs',6567,6570). predicate(current_flag,1,'Examine existing flags',6572,6575). predicate(current_key,1,'Examine existing database keys',6577,6580). predicate(current_predicate,1,'Examine existing predicates (ISO)',6582,6598). predicate(current_predicate,2,'Examine existing predicates',6600,6617). predicate(predicate_property,2,'Query predicate attributes',6619,6768). predicate(dwim_predicate,2,'Find predicate in ``Do What I Mean\'\' sense',6770,6779). predicate(clause,2,'Get clauses of a predicate',6781,6785). predicate(clause,3,'Get clauses of a predicate',6787,6792). predicate(nth_clause,3,'N-th clause of a predicate',6794,6813). predicate(clause_property,2,'Get properties of a clause',6815,6853). predicate(open,4,'Open a file (creating a stream)',6931,7039). predicate(open,3,'Open a file (creating a stream)',7041,7043). predicate(open_null_stream,1,'Open a stream to discard output',7045,7063). predicate(close,1,'Close stream',7065,7073). predicate(close,2,'Close stream (forced)',7075,7079). predicate(stream_property,2,'Get stream properties',7081,7194). predicate(current_stream,3,'Examine open streams',7196,7203). predicate(is_stream,1,'Type check for a stream handle',7205,7209). predicate(stream_pair,3,'Create/examine a bi-directional stream',7211,7218). predicate(set_stream_position,2,'Seek stream to position',7220,7224). predicate(stream_position_data,3,'Access fields from stream position',7226,7232). predicate(seek,4,'Modify the current position in a stream',7234,7262). predicate(set_stream,2,'Set stream attribute',7264,7359). predicate(set_prolog_IO,3,'Prepare streams for interactive session',7361,7372). predicate(see,1,'Change the current input stream',7451,7456). predicate(tell,1,'Change current output stream',7458,7463). predicate(append,1,'Append to a file',7465,7469). predicate(seeing,1,'Query the current input stream',7471,7476). predicate(telling,1,'Query current output stream',7478,7483). predicate(seen,0,'Close the current input stream',7485,7488). predicate(told,0,'Close current output',7490,7493). predicate(set_input,1,'Set current input stream from a stream',7501,7505). predicate(set_output,1,'Set current output stream from a stream',7507,7510). predicate(current_input,1,'Get current input stream',7512,7515). predicate(current_output,1,'Get the current output stream',7517,7519). predicate(with_output_to,2,'Write to strings and more',7524,7574). predicate(wait_for_input,3,'Wait for input with optional timeout',7579,7621). predicate(byte_count,2,'Byte-position in a stream',7623,7628). predicate(character_count,2,'Get character index on a stream',7630,7635). predicate(line_count,2,'Line number on stream',7637,7640). predicate(line_position,2,'Character position in line on stream',7642,7647). predicate(nl,0,'Generate a newline',7654,7657). predicate(nl,1,'Generate a newline on a stream',7659,7661). predicate(put,1,'Write a character',7663,7668). predicate(put,2,'Write a character on a stream',7670,7672). predicate(put_byte,1,'Write a byte',7674,7677). predicate(put_byte,2,'Write a byte on a stream',7679,7682). predicate(put_char,1,'Write a character',7684,7689). predicate(put_char,2,'Write a character on a stream',7691,7695). predicate(put_code,1,'Write a character-code',7697,7701). predicate(put_code,2,'Write a character-code on a stream',7703,7705). predicate(tab,1,'Output number of spaces',7707,7711). predicate(tab,2,'Output number of spaces on a stream',7713,7715). predicate(flush_output,0,'Output pending characters on current stream',7717,7721). predicate(flush_output,1,'Output pending characters on specified stream',7723,7726). predicate(ttyflush,0,'Flush output on terminal',7728,7730). predicate(get_byte,1,'Read next byte (ISO)',7732,7736). predicate(get_byte,2,'Read next byte from a stream (ISO)',7738,7741). predicate(get_code,1,'Read next character (ISO)',7743,7747). predicate(get_code,2,'Read next character from a stream (ISO)',7749,7751). predicate(get_char,1,'Read next character as an atom (ISO)',7753,7757). predicate(get_char,2,'Read next character from a stream (ISO)',7759,7762). predicate(get0,1,'Read next character',7764,7769). predicate(get0,2,'Read next character from a stream',7771,7774). predicate(get,1,'Read first non-blank character',7776,7780). predicate(get,2,'Read first non-blank character from a stream',7782,7785). predicate(peek_byte,1,'Read byte without removing',7787,7788). predicate(peek_byte,2,'Read byte without removing',7790,7791). predicate(peek_code,1,'Read character-code without removing',7793,7794). predicate(peek_code,2,'Read character-code without removing',7796,7797). predicate(peek_char,1,'Read character without removing',7799,7800). predicate(peek_char,2,'Read character without removing',7802,7809). predicate(skip,1,'Skip to character in current input',7811,7815). predicate(skip,2,'Skip to character on stream',7817,7819). predicate(get_single_char,1,'Read next character from the terminal',7821,7830). predicate(at_end_of_stream,0,'Test for end of file on input',7832,7836). predicate(at_end_of_stream,1,'Test for end of file on stream',7838,7843). predicate(set_end_of_stream,1,'Set physical end of an open file',7845,7849). predicate(copy_stream_data,3,'Copy n bytes from stream to stream',7851,7856). predicate(copy_stream_data,2,'Copy all data from stream to stream',7858,7860). predicate(read_pending_input,3,'Fetch buffered input from a stream',7862,7888). predicate(write_term,2,'Write term with options',7902,8043). predicate(write_term,3,'Write term with options to stream',8045,8048). predicate(write_length,3,'Dermine #characters to output a term',8050,8059). predicate(write_canonical,1,'Write a term with quotes, ignore operators',8061,8075). predicate(write_canonical,2,'Write a term with quotes, ignore operators on a stream',8077,8079). predicate(write,1,'Write term',8081,8084). predicate(write,2,'Write term to stream',8086,8088). predicate(writeq,1,'Write term, insert quotes',8090,8095). predicate(writeq,2,'Write term, insert quotes on stream',8097,8099). predicate(writeln,1,'Write term, followed by a newline',8101,8103). predicate(print,1,'Print a term',8105,8111). predicate(print,2,'Print a term on a stream',8113,8115). predicate(portray,1,'Hook (user) Modify behaviour of print/1',8117,8124). predicate(read,1,'Read Prolog term',8126,8131). predicate(read,2,'Read Prolog term from stream',8133,8135). predicate(read_clause,3,'Read clause from stream',8137,8167). predicate(read_term,2,'Read term with options',8169,8286). predicate(read_term,3,'Read term with options from stream',8288,8290). predicate(read_term_from_atom,3,'Read term with options from atom',8292,8297). predicate(read_history,6,'Read using history substitution',8299,8314). predicate(prompt,2,'Change the prompt used by read/1',8316,8324). predicate(prompt1,1,'Change prompt for 1 line',8326,8329). predicate(functor,3,'Get name and arity of a term or construct a term ',8334,8341). predicate(arg,3,'Access argument of a term',8343,8352). predicate(=..,2,'``Univ.\'\' Term to list conversion',8354,8369). predicate(numbervars,3,'Number unbound variables of a term',8371,8385). predicate(numbervars,4,'Number unbound variables of a term',8387,8406). predicate(var_number,2,'Check that var is numbered by numbervars',8408,8414). predicate(term_variables,2,'Find unbound variables in a term',8416,8426). predicate(term_variables,3,'Find unbound variables in a term',8428,8431). predicate(copy_term,2,'Make a copy of a term',8433,8442). predicate(setarg,3,'Destructive assignment on term',8454,8470). predicate(nb_setarg,3,'Non-backtrackable assignment to term',8472,8502). predicate(nb_linkarg,3,'Non-backtrackable assignment to term',8504,8508). predicate(duplicate_term,2,'Create a copy of a term',8510,8515). predicate(same_term,2,'Test terms to be at the same address',8517,8522). predicate(atom_codes,2,'Convert between atom and list of characters codes',8545,8551). predicate(atom_chars,2,'Convert between atom and list of characters',8553,8561). predicate(char_code,2,'Convert between character and character code',8563,8566). predicate(number_chars,2,'Convert between number and one-char atoms',8568,8575). predicate(number_codes,2,'Convert between number and character codes',8577,8581). predicate(atom_number,2,'Convert between atom and number',8583,8590). predicate(name,2,'Convert between atom and list of character codes',8592,8609). predicate(term_to_atom,2,'Convert between term and atom',8611,8617). predicate(atom_to_term,3,'Convert between atom and term',8619,8626). predicate(atom_concat,3,'Append two atoms',8628,8635). predicate(atomic_concat,3,'Concatenate two atomic values to an atom',8637,8645). predicate(atomic_list_concat,2,'Append a list of atoms',8647,8651). predicate(atomic_list_concat,3,'Append a list of atoms with separator',8653,8674). predicate(atom_length,2,'Determine length of an atom',8676,8682). predicate(atom_prefix,2,'Test for start of atom',8684,8687). predicate(sub_atom,5,'Take a substring from an atom',8689,8703). predicate(sub_atom_icasechk,3,'Case insensitive substring match',8705,8711). predicate(locale_create,3,'Create a new locale object',8741,8775). predicate(locale_destroy,1,'Destroy a locale object',8777,8781). predicate(locale_property,2,'Query properties of locale objects',8783,8786). predicate(set_locale,1,'Set the default local',8788,8794). predicate(current_locale,1,'Get the current locale',8796,8798). predicate(char_type,2,'Classify characters',8813,8921). predicate(code_type,2,'Classify a character-code',8923,8930). predicate(downcase_atom,2,'Convert atom to lower-case',8940,8945). predicate(upcase_atom,2,'Convert atom to upper-case',8947,8949). predicate(normalize_space,2,'Normalize white space',8954,8959). predicate(collation_key,2,'Sort key for locale dependent ordering',8967,8980). predicate(locale_sort,2,'Language dependent sort of atoms',8982,8987). predicate(atom_string,2,'Conversion between atom and string',9033,9037). predicate(string_codes,2,'Conversion between string and list of character codes',9039,9042). predicate(string_length,2,'Determine length of a string',9044,9048). predicate(string_code,3,'Get or find a character code in a string',9050,9059). predicate(string_concat,3,'atom_concat/3 for strings',9061,9070). predicate(sub_string,5,'Take a substring from a string',9072,9076). predicate(op,3,'Declare an operator',9114,9179). predicate(current_op,3,'Examine current operator declarations',9181,9184). predicate(char_conversion,2,'Provide mapping of input characters',9192,9198). predicate(current_char_conversion,2,'Query input character mapping',9200,9203). predicate(between,3,'Integer range checking/generating',9223,9230). predicate(succ,2,'Logical integer successor relation',9232,9238). predicate(plus,3,'Logical integer addition',9240,9243). predicate(>,2,'Arithmetic larger',9254,9256). predicate(<,2,'Arithmetic smaller',9258,9260). predicate(=<,2,'Arithmetic smaller or equal',9262,9265). predicate(>=,2,'Arithmetic larger or equal',9267,9270). predicate(=\=,2,'Arithmetic not equal',9272,9274). predicate(=:=,2,'Arithmetic equal',9276,9278). predicate(is,2,'Evaluate arithmetic expression',9280,9289). predicate(-,1,'Unary minus',9405,9407). predicate(+,1,'Unary plus (No-op)',9409,9412). predicate(+,2,'Addition',9414,9416). predicate(-,2,'Subtraction',9418,9420). predicate(*,2,'Multiplication',9422,9424). predicate(/,2,'Division',9426,9434). predicate(mod,2,'Remainder of division',9436,9439). predicate(rem,2,'Remainder of division',9441,9444). predicate(//,2,'Integer division',9446,9451). predicate(div,2,'Integer division',9453,9466). predicate(rdiv,2,'Ration number division',9468,9472). predicate(gcd,2,'Greatest common divisor',9474,9476). predicate(abs,1,'Absolute value',9478,9480). predicate(sign,1,'Extract sign of value',9482,9487). predicate(copysign,2,'Apply sign of N2 to N1',9489,9500). predicate(max,2,'Maximum of two numbers',9502,9507). predicate(min,2,'Minimum of two numbers',9509,9512). predicate('.',2,'Consult. Also list constructor',9514,9523). predicate(random,1,'Binds R to a new random float in the _open_ interval (0.0,1.0).',9525,9537). predicate(random_float,0,'Generate random number',9539,9545). predicate(round,1,'Round to nearest integer',9547,9549). predicate(integer,1,'Type check for integer',9551,9553). predicate(float,1,'Type check for a floating point number',9555,9560). predicate(rational,1,'Type check for a rational number',9562,9580). predicate(rationalize,1,'Convert to rational number',9582,9596). predicate(float_fractional_part,1,'Fractional part of a float',9598,9603). predicate(float_integer_part,1,'Integer part of a float',9605,9608). predicate(truncate,1,'Truncate float to integer',9610,9614). predicate(floor,1,'Largest integer below argument',9616,9619). predicate(ceiling,1,'Smallest integer larger than arg',9621,9624). predicate(ceil,1,'Smallest integer larger than arg',9626,9628). predicate(>>,2,'Bitwise right shift',9630,9635). predicate(<<,2,'Bitwise left shift',9637,9639). predicate(\/,2,'Bitwise or',9641,9643). predicate(/\,2,'Bitwise and',9645,9647). predicate(xor,2,'Bitwise exclusive or',9649,9651). predicate(\,1,'Bitwise negation',9653,9656). predicate(sqrt,1,'Square root',9658,9660). predicate(sin,1,'Sine',9662,9664). predicate(cos,1,'Cosine',9666,9668). predicate(tan,1,'Tangent',9670,9672). predicate(asin,1,'Inverse (arc) sine',9674,9676). predicate(acos,1,'Inverse (arc) cosine',9678,9680). predicate(atan,1,'Inverse hyperbolic sine',9682,9684). predicate(atan2,2,'Rectangular to polar conversion',9686,9690). predicate(atan,2,'Rectangular to polar conversion',9692,9694). predicate(sinh,1,'Hyperbolic sine',9696,9699). predicate(cosh,1,'Hyperbolic cosine',9701,9704). predicate(tanh,1,'Hyperbolic tangent',9706,9709). predicate(asinh,1,'Inverse (arc) sine',9711,9713). predicate(acosh,1,'Inverse hyperbolic cosine',9715,9717). predicate(atanh,1,'Inverse hyperbolic tangent',9719,9721). predicate(log,1,'Natural logarithm',9723,9725). predicate(log10,1,'10 base logarithm',9727,9729). predicate(exp,1,'Exponent (base $e$)',9731,9733). predicate(**,2,'Power function',9735,9750). predicate(^,2,'Existential quantification (bagof/3, setof/3)',9752,9770). predicate(powm,3,'Integer exponent and modulo',9772,9777). predicate(lgamma,1,'',9779,9782). predicate(erf,1,'',9784,9789). predicate(erfc,1,'',9791,9793). predicate(pi,0,'Mathematical constant',9795,9797). predicate(e,0,'Mathematical constant',9799,9801). predicate(epsilon,0,'Floating point precision',9803,9806). predicate(cputime,0,'Get CPU time',9808,9812). predicate(eval,1,'Evaluate term as expression',9814,9826). predicate(msb,1,'Most significant bit',9828,9833). predicate(lsb,1,'Least significant bit',9835,9840). predicate(popcount,1,'Count 1s in a bitvector',9842,9845). predicate(set_random,1,'Control random number generation',9850,9872). predicate(random_property,1,'Query properties of random generation',9874,9886). predicate(current_arithmetic_function,1,'Examine evaluable functions',9888,9895). predicate(is_list,1,'Type check for a list',9904,9918). predicate(memberchk,2,'Deterministic member/2',9920,9928). predicate(length,2,'Length of a list',9930,9947). predicate(sort,2,'Sort elements in a list',9949,9955). predicate(msort,2,'Sort, do not remove duplicates',9957,9960). predicate(keysort,2,'Sort, using a key',9962,9984). predicate(predsort,3,'Sort, using a predicate to determine the order',9986,9991). predicate(findall,3,'Find all solutions to a goal',9996,10003). predicate(findall,4,'Difference list version of findall/3',10005,10013). predicate(bagof,3,'Find all solutions to a goal',10015,10047). predicate(setof,3,'Find all unique solutions to a goal',10049,10052). predicate(forall,2,'Prove goal for all solutions of another goal',10057,10098). predicate(writef,1,'Formatted write',10113,10115). predicate(writef,2,'Formatted write on stream',10117,10176). predicate(swritef,3,'Formatted write on a string',10178,10186). predicate(swritef,2,'Formatted write on a string',10188,10190). predicate(format,1,'Formatted output',10198,10201). predicate(format,2,'Formatted output with arguments',10203,10374). predicate(format,3,'Formatted output on a stream',10376,10386). predicate(format_predicate,2,'Program format/[1,2]',10391,10420). predicate(current_format_predicate,2,'Enumerate user-defined format codes',10422,10425). predicate(tty_get_capability,3,'Get terminal parameter',10435,10443). predicate(tty_goto,2,'Goto position on screen',10445,10449). predicate(tty_put,2,'Write control string to terminal',10451,10457). predicate(tty_size,2,'Get row/column size of the terminal',10459,10473). predicate(shell,2,'Execute OS command',10478,10507). predicate(shell,1,'Execute OS command',10509,10511). predicate(shell,0,'Execute interactive subshell',10513,10517). predicate(getenv,2,'Get shell environment variable',10519,10523). predicate(setenv,2,'Set shell environment variable',10525,10534). predicate(unsetenv,1,'Delete shell environment variable',10536,10540). predicate(setlocale,3,'Set/query C-library regional information',10542,10554). predicate(unix,1,'OS interaction',10556,10597). predicate(win_exec,2,'Win32: spawn Windows task',10608,10615). predicate(win_shell,3,'Win32: open document through Shell',10617,10626). predicate(win_shell,2,'Win32: open document through Shell',10628,10630). predicate(win_registry_get_value,3,'Win32: get registry value',10632,10653). predicate(win_folder,2,'Win32: get special folder by CSIDL',10655,10668). predicate(win_add_dll_directory,1,'Add directory to DLL search path',10670,10679). predicate(win_add_dll_directory,2,'Add directory to DLL search path',10681,10704). predicate(win_remove_dll_directory,1,'',10706,10709). predicate(get_time,1,'Get current time',10783,10786). predicate(stamp_date_time,3,'Convert time-stamp to date structure',10788,10794). predicate(date_time_stamp,2,'Convert sate structure to time-stamp',10796,10847). predicate(date_time_value,3,'Extract info from a date structure',10849,10866). predicate(format_time,3,'C strftime() like date/time formatter',10868,11030). predicate(format_time,4,'date/time formatter with explicit locale',11032,11041). predicate(parse_time,2,'Parse text to a time-stamp',11043,11045). predicate(parse_time,3,'Parse text to a time-stamp',11047,11066). predicate(day_of_the_week,2,'Determine ordinal-day from date',11068,11073). predicate(window_title,2,'Win32: change title of window',11084,11087). predicate(win_window_pos,1,'Win32: change size and position of window',11089,11112). predicate(win_has_menu,0,'Win32: true if console menu is available',11114,11116). predicate(win_insert_menu,2,'swipl-win.exe: add menu',11118,11129). predicate(win_insert_menu_item,4,'swipl-win.exe: add item to menu',11131,11135). predicate(access_file,2,'Check access permissions of a file',11140,11150). predicate(exists_file,1,'Check existence of file',11152,11155). predicate(file_directory_name,2,'Get directory part of path',11157,11174). predicate(file_base_name,2,'Get file part of path',11176,11180). predicate(same_file,2,'Succeeds if arguments refer to same file',11182,11191). predicate(exists_directory,1,'Check existence of directory',11193,11196). predicate(delete_file,1,'Remove a file from the file system',11198,11200). predicate(rename_file,2,'Change name of file',11202,11208). predicate(size_file,2,'Get size of a file in characters',11210,11212). predicate(time_file,2,'Get last modification time of file',11214,11218). predicate(absolute_file_name,2,'Get absolute path name',11220,11228). predicate(absolute_file_name,3,'Get absolute path name with options',11230,11287). predicate(is_absolute_file_name,1,'True if arg defines an absolute path',11289,11295). predicate(file_name_extension,3,'Add, remove or test file extensions',11297,11305). predicate(directory_files,2,'Get entries of a directory/folder',11307,11313). predicate(expand_file_name,2,'Wildcard expansion of file names',11315,11332). predicate(prolog_to_os_filename,2,'Convert between Prolog and OS filenames',11334,11340). predicate(read_link,3,'Read a symbolic link',11342,11348). predicate(tmp_file,2,'Create a temporary filename',11350,11360). predicate(tmp_file_stream,3,'Create a temporary file and open it',11362,11389). predicate(make_directory,1,'Create a folder on the file system',11391,11395). predicate(delete_directory,1,'Remove a folder from the file system',11397,11401). predicate(working_directory,2,'Query/change CWD',11403,11409). predicate(chdir,1,'Compatibility: change working directory',11411,11413). predicate(break,0,'Start interactive top level',11418,11426). predicate(abort,0,'Abort execution, return to top level',11428,11445). predicate(halt,0,'Exit from Prolog',11447,11450). predicate(halt,1,'Exit from Prolog with status',11452,11481). predicate(prolog,0,'Run interactive top level',11483,11492). predicate(expand_query,4,'Expanded entered query',11494,11502). predicate(expand_answer,2,'Expand answer of query',11504,11509). predicate(protocol,1,'Make a log of the user interaction',11518,11521). predicate(protocola,1,'Append log of the user interaction to file',11523,11526). predicate(noprotocol,0,'Disable logging of user interaction',11528,11531). predicate(protocolling,1,'On what file is user interaction logged',11533,11536). predicate(trace,0,'Start the tracer',11547,11551). predicate(tracing,0,'Query status of the tracer',11553,11556). predicate(notrace,0,'Stop tracing',11558,11560). predicate(guitracer,0,'Install hooks for the graphical debugger',11562,11567). predicate(noguitracer,0,'Disable the graphical debugger',11569,11571). predicate(trace,1,'Set trace point on predicate',11573,11575). predicate(trace,2,'Set/Clear trace point on ports',11577,11597). predicate(notrace,1,'Do not debug argument goal',11599,11604). predicate(debug,0,'Test for debugging mode',11606,11620). predicate(nodebug,0,'Disable debugging',11622,11625). predicate(debugging,0,'Show debugger status',11627,11630). predicate(spy,1,'Force tracer on specified predicate',11632,11635). predicate(nospy,1,'Remove spy point',11637,11640). predicate(nospyall,0,'Remove all spy points',11642,11644). predicate(leash,1,'Change ports visited by the tracer',11646,11654). predicate(visible,1,'Ports that are visible in the tracer',11656,11659). predicate(unknown,2,'Trap undefined predicates',11661,11666). predicate(style_check,1,'Change level of warnings',11668,11752). predicate(statistics,2,'Obtain collected statistics',11757,11844). predicate(statistics,0,'Show execution statistics',11846,11848). predicate(time,1,'Determine time needed to execute goal',11850,11858). predicate(profile,1,'Obtain execution statistics',11876,11880). predicate(profile,2,'Obtain execution statistics',11882,11895). predicate(show_profile,1,'Show results of the profiler',11897,11909). predicate(profiler,2,'Obtain/change status of the profiler',11911,11925). predicate(reset_profiler,0,'Clear statistics obtained by the profiler',11927,11929). predicate(noprofile,1,'Hide (meta-) predicate for the profiler',11931,11937). predicate(garbage_collect,0,'Invoke the garbage collector',12040,12047). predicate(garbage_collect_atoms,0,'Invoke the atom garbage collector',12049,12057). predicate(trim_stacks,0,'Release unused memory resources',12059,12077). predicate(set_prolog_stack,2,'Modify stack characteristics',12079,12118). predicate(prolog_stack_property,2,'Query properties of the stacks',12120,12123). predicate(open_dde_conversation,3,'Win32: Open DDE channel',12169,12174). predicate(close_dde_conversation,1,'Win32: Close DDE channel',12176,12181). predicate(dde_request,3,'Win32: Make a DDE request',12183,12187). predicate(dde_execute,2,'Win32: Execute command on DDE server',12189,12193). predicate(dde_poke,3,'Win32: POKE operation on DDE server',12195,12198). predicate(dde_register_service,2,'Win32: Become a DDE server',12209,12246). predicate(dde_unregister_service,1,'Win32: Terminate a DDE service',12248,12251). predicate(dde_current_service,2,'Win32: Examine DDE services provided',12253,12255). predicate(dde_current_connection,2,'Win32: Examine open DDE connections',12257,12259). predicate(dwim_match,2,'Atoms match in ``Do What I Mean\'\' sense',12264,12282). predicate(dwim_match,3,'Atoms match in ``Do What I Mean\'\' sense',12284,12289). predicate(wildcard_match,2,'Csh(1) style wildcard match',12291,12307). predicate(sleep,1,'Suspend execution for specified time',12309,12319). predicate(module,2,'Declare a module',12400,12413). predicate(module,3,'Declare a module with language options',12415,12424). predicate(use_module,1,'Import a module',12440,12484). predicate(use_module,2,'Import predicates from a module',12486,12512). predicate(meta_predicate,1,'Declare access to other predicates',12565,12642). predicate(@,2,'Call using calling context',12686,12701). predicate(module,1,'Query/set current type-in module',12719,12731). predicate(reexport,1,'Load files and re-export the imported predicates',12754,12758). predicate(reexport,2,'Load predicates from a file and re-export it',12760,12764). predicate(import_module,2,'Query import modules',12819,12824). predicate(default_module,2,'Query module inheritance',12826,12831). predicate(add_import_module,3,'Add module to the auto-import list',12833,12837). predicate(delete_import_module,2,'Remove module from import list',12839,12846). predicate(export,1,'Export a predicate from a module',12875,12881). predicate(import,1,'Import a predicate from a module',12883,12890). predicate(module_transparent,1,'Indicate module based meta-predicate',13001,13005). predicate(context_module,1,'Get context module of current goal',13007,13010). predicate(strip_module,3,'Extract context module and term',13012,13018). predicate(current_module,1,'Examine existing modules',13026,13031). predicate(module_property,2,'Find properties of a module',13033,13071). predicate(set_module,1,'Set properties of a module',13073,13083). predicate(attvar,1,'Type test for attributed variable',13276,13280). predicate(put_attr,3,'Put attribute on a variable',13282,13290). predicate(get_attr,3,'Fetch named attribute from a variable',13292,13297). predicate(del_attr,2,'Delete attribute from variable',13299,13305). predicate(attr_unify_hook,2,'Attributed variable unification hook',13314,13325). predicate(attr_portray_hook,2,'Attributed variable print hook',13327,13334). predicate(attribute_goals,3,'Project attributes to goals',13336,13341). predicate(copy_term,3,'Copy a term and obtain attribute-goals',13346,13358). predicate(copy_term_nat,2,'Make a copy of a term without attributes',13360,13363). predicate(term_attvars,2,'Find attributed variables in a term',13365,13372). predicate(get_attrs,2,'Fetch all attributes of a variable',13382,13386). predicate(put_attrs,2,'Set/replace all attributes on a variable',13388,13391). predicate(del_attrs,1,'Delete all attributes from variable',13393,13396). predicate(freeze,2,'Delay execution until variable is bound',13416,13423). predicate(frozen,2,'Query delayed goals on var',13425,13428). predicate(when,2,'Execute goal when condition becomes true',13430,13439). predicate(dif,2,'Constrain two terms to be different',13441,13453). predicate(call_residue_vars,2,'Find residual attributed variables',13455,13473). predicate(b_setval,2,'Assign backtrackable global variable',13514,13520). predicate(b_getval,2,'Fetch backtrackable global variable',13522,13529). predicate(nb_setval,2,'Assign non-backtrackable global variable',13531,13535). predicate(nb_getval,2,'Fetch non-backtrackable global variable',13537,13543). predicate(nb_linkval,2,'Assign non-backtrackable global variable',13545,13566). predicate(nb_current,2,'Enumerate non-backtrackable global variables',13568,13571). predicate(nb_delete,1,'Delete a non-backtrackable global variable',13573,13575). predicate(chr_option,2,'Specify CHR compilation options',13783,13821). predicate(chr_constraint,1,'CHR Constraint declaration',13836,13911). predicate(chr_type,1,'CHR Type declaration',13913,14042). predicate(chr_trace,0,'Start CHR tracer',14179,14183). predicate(chr_notrace,0,'Stop CHR tracer',14185,14189). predicate(chr_leash,1,'Define CHR leashed ports',14191,14198). predicate(chr_show_store,1,'List suspended CHR constraints',14200,14207). predicate(find_chr_constraint,1,'Returns a constraint from the store',14209,14212). predicate(thread_create,3,'Create a new Prolog task',14510,14591). predicate(thread_self,1,'Get identifier of current thread',14593,14596). predicate(thread_join,2,'Wait for Prolog task-completion',14598,14624). predicate(thread_detach,1,'Make thread cleanup after completion',14626,14638). predicate(thread_exit,1,'Terminate Prolog task with value',14640,14651). predicate(thread_initialization,1,'Run action at start of thread',14653,14662). predicate(thread_at_exit,1,'Register goal to be called at exit',14664,14679). predicate(thread_setconcurrency,2,'Number of active threads',14681,14688). predicate(thread_property,2,'Examine Prolog threads',14703,14744). predicate(thread_statistics,3,'Get statistics of another thread',14746,14751). predicate(mutex_statistics,0,'Print statistics on mutex usage',14753,14760). predicate(thread_send_message,2,'Send message to another thread',14777,14793). predicate(thread_get_message,1,'Wait for message',14795,14815). predicate(thread_peek_message,1,'Test for message',14817,14824). predicate(message_queue_create,1,'Create queue for thread communication',14826,14831). predicate(message_queue_create,2,'Create queue for thread communication',14833,14846). predicate(message_queue_destroy,1,'Destroy queue for thread communication',14848,14853). predicate(thread_get_message,2,'Wait for message in a queue',14855,14861). predicate(thread_get_message,3,'Wait for message in a queue',14863,14885). predicate(thread_peek_message,2,'Test for message in a queue',14887,14892). predicate(message_queue_property,2,'Query message queue properties',14894,14953). predicate(thread_signal,2,'Execute goal in another thread',14968,14986). predicate(thread_local,1,'Declare thread-specific clauses for a predicate',15006,15035). predicate(mutex_create,1,'Create a thread-synchronisation device',15069,15073). predicate(mutex_create,2,'Create a thread-synchronisation device',15075,15081). predicate(mutex_destroy,1,'Destroy a mutex',15083,15086). predicate(with_mutex,2,'Run goal while holding mutex',15088,15099). predicate(mutex_lock,1,'Become owner of a mutex',15101,15119). predicate(mutex_trylock,1,'Become owner of a mutex (non-blocking)',15121,15124). predicate(mutex_unlock,1,'Release ownership of mutex',15126,15130). predicate(mutex_unlock_all,0,'Release ownership of all mutexes',15132,15136). predicate(mutex_property,2,'Query mutex properties',15138,15152). predicate(threads,0,'List running threads',15161,15163). predicate(join_threads,0,'Join all terminated threads interactively',15165,15172). predicate(interactor,0,'Start new thread with console and top level',15174,15178). predicate(attach_console,0,'Attach I/O console to thread',15192,15207). predicate(tdebug,1,'Switch a thread into debug mode',15209,15217). predicate(tdebug,0,'Switch all threads into debug mode',15219,15221). predicate(tnodebug,1,'Switch off debug mode in a thread',15223,15225). predicate(tnodebug,0,'Switch off debug mode in all threads',15227,15229). predicate(tspy,2,'Set spy point and enable debugging in a thread',15231,15237). predicate(tspy,1,'Set spy point and enable debugging in all threads',15239,15244). predicate(tprofile,1,'Profile a thread for some period',15255,15259). predicate(in_pce_thread,1,'Run goal in XPCE thread',15455,15462). predicate(in_pce_thread_sync,1,'Run goal in XPCE thread',15464,15477). predicate(pce_dispatch,1,'Run XPCE GUI in separate thread',15479,15486). predicate(load_foreign_library,1,'library(shlib) Load shared library (.so file)',15630,15631). predicate(load_foreign_library,2,'library(shlib) Load shared library (.so file)',15633,15659). predicate(use_foreign_library,1,'Load DLL/shared object (directive)',15661,15662). predicate(use_foreign_library,2,'Load DLL/shared object (directive)',15664,15677). predicate(unload_foreign_library,1,'library(shlib) Detach shared library (.so file)',15679,15680). predicate(unload_foreign_library,2,'library(shlib) Detach shared library (.so file)',15682,15687). predicate(current_foreign_library,2,'library(shlib) Examine loaded shared libraries (.so files)',15689,15691). predicate(reload_foreign_libraries,0,'Reload DLLs/shared objects',15693,15696). predicate(open_shared_object,2,'UNIX: Open shared library (.so file)',15708,15717). predicate(open_shared_object,3,'UNIX: Open shared library (.so file)',15719,15728). predicate(close_shared_object,1,'UNIX: Close shared library (.so file)',15730,15732). predicate(call_shared_object_function,2,'UNIX: Call C-function in shared (.so) file',15734,15739). predicate(qsave_program,2,'Create runtime application',19540,19605). predicate(qsave_program,1,'Create runtime application',19607,19609). predicate(autoload,0,'Autoload all predicates now',19611,19660). predicate(volatile,1,'Predicates that are not saved',19662,19667). predicate(resource,3,'Declare a program resource',19791,19825). predicate(open_resource,3,'Open a program resource as a stream',19827,19846). predicate(aggregate,3,'Aggregate bindings in Goal according to Template.',20037,20040). predicate(aggregate,4,'Aggregate bindings in Goal according to Template.',20042,20045). predicate(aggregate_all,3,'Aggregate bindings in Goal according to Template.',20047,20050). predicate(aggregate_all,4,'Aggregate bindings in Goal according to Template.',20052,20056). predicate(foreach,2,'True if conjunction of results is true.',20058,20080). predicate(free_variables,4,'Find free variables in bagof/setof template.',20082,20106). predicate(safe_meta,2,'Declare the aggregate meta-calls safe.',20108,20111). predicate(include,3,'Filter elements for which Goal succeeds.',20126,20132). predicate(exclude,3,'Filter elements for which Goal fails.',20134,20137). predicate(partition,4,'Filter elements of List according to Pred.',20139,20143). predicate(partition,5,'Filter List according to Pred in three sets.',20145,20150). predicate(maplist,2,'True if Goal can successfully be applied on all elements of List.',20152,20156). predicate(maplist,3,'As maplist/2, operating on pairs of elements from two lists.',20158,20160). predicate(maplist,4,'As maplist/2, operating on triples of elements from three lists.',20162,20164). predicate(maplist,5,'As maplist/2, operating on quadruples of elements from four lists.',20166,20168). predicate(foldl,4,'Fold a list, using arguments of the list as left argument.',20170,20171). predicate(foldl,5,'Fold a list, using arguments of the list as left argument.',20173,20174). predicate(foldl,6,'Fold a list, using arguments of the list as left argument.',20176,20177). predicate(foldl,7,'Fold a list, using arguments of the list as left argument.',20179,20189). predicate(scanl,4,'Left scan of list.',20191,20192). predicate(scanl,5,'Left scan of list.',20194,20195). predicate(scanl,6,'Left scan of list.',20197,20198). predicate(scanl,7,'Left scan of list.',20200,20211). predicate(assoc_to_list,2,'Convert association tree to list',20226,20229). predicate(assoc_to_keys,2,'Translate assoc into a key list',20231,20234). predicate(assoc_to_values,2,'Translate assoc into a value list',20236,20239). predicate(empty_assoc,1,'Create/test empty association tree',20241,20243). predicate(gen_assoc,3,'Enumerate members of association tree',20245,20248). predicate(get_assoc,3,'Fetch key from association tree',20250,20253). predicate(get_assoc,5,'Fetch key from association tree',20255,20258). predicate(list_to_assoc,2,'Create association tree from list',20260,20263). predicate(map_assoc,2,'Map association tree',20265,20267). predicate(map_assoc,3,'Map association tree',20269,20272). predicate(max_assoc,3,'Highest key in association tree',20274,20277). predicate(min_assoc,3,'Lowest key in association tree',20279,20282). predicate(ord_list_to_assoc,2,'Convert ordered list to assoc',20284,20287). predicate(put_assoc,4,'Add Key-Value to association tree',20289,20293). predicate(is_assoc,1,'Verify association list',20295,20298). predicate(broadcast,1,'Send event notification',20322,20328). predicate(broadcast_request,1,'Request all agents',20330,20344). predicate(listen,2,'Listen to event notifications',20346,20358). predicate(listen,3,'Listen to event notifications',20360,20395). predicate(unlisten,1,'Stop listening to event notifications',20397,20399). predicate(unlisten,2,'Stop listening to event notifications',20401,20404). predicate(unlisten,3,'Stop listening to event notifications',20406,20409). predicate(listening,3,'Who is listening to event notifications?',20411,20414). predicate(format_to_chars,3,'Use format/2 to write to a list of character codes.',20429,20431). predicate(format_to_chars,4,'Use format/2 to write to a difference list of character codes.',20433,20435). predicate(write_to_chars,2,'Write a term to a code list.',20437,20440). predicate(write_to_chars,3,'Write a term to a code list.',20442,20445). predicate(atom_to_chars,2,'Convert Atom into a list of character codes.',20447,20451). predicate(atom_to_chars,3,'Convert Atom into a difference list of character codes.',20453,20455). predicate(number_to_chars,2,'Convert Atom into a list of character codes.',20457,20461). predicate(number_to_chars,3,'Convert Number into a difference list of character codes.',20463,20465). predicate(read_from_chars,2,'Read Codes into Term.',20467,20472). predicate(read_term_from_chars,3,'Read Codes into Term.',20474,20478). predicate(open_chars_stream,2,'Open Codes as an input stream.',20480,20487). predicate(with_output_to_chars,2,'Run Goal as with once/1.',20489,20492). predicate(with_output_to_chars,3,'Run Goal as with once/1.',20494,20497). predicate(with_output_to_chars,4,'Same as with_output_to_chars/3 using an explicit stream.',20499,20503). predicate(check,0,'Program completeness and consistency',20511,20519). predicate(list_undefined,0,'List undefined predicates',20521,20549). predicate(list_autoload,0,'List predicates that require autoload',20551,20555). predicate(list_redefined,0,'List locally redefined predicates',20557,20561). predicate(in,2,'Var is an element of Domain.',20864,20878). predicate(ins,2,'The variables in the list Vars are elements of Domain.',20880,20882). predicate(indomain,1,'Bind Var to all feasible values of its domain on backtracking.',20884,20887). predicate(label,1,'Equivalent to labeling([], Vars).',20889,20891). predicate(labeling,2,'Assign a value to each variable in Vars.',20893,20978). predicate(all_different,1,'Vars are pairwise distinct.',20980,20982). predicate(all_distinct,1,'Like all_different/1, with stronger propagation.',20984,20995). predicate(sum,3,'The sum of elements of the list Vars is in relation Rel to Expr.',20997,21008). predicate(scalar_product,4,'Cs is a list of integers, Vs is a list of variables and integers.',21010,21014). predicate(#>=,2,'X is greater than or equal to Y.',21016,21018). predicate(#=<,2,'X is less than or equal to Y.',21020,21022). predicate(#=,2,'X equals Y.',21024,21026). predicate(#\=,2,'X is not Y.',21028,21030). predicate(#>,2,'X is greater than Y.',21032,21034). predicate(#<,2,'X is less than Y.',21036,21051). predicate(#\,1,'The reifiable constraint Q does _not_ hold.',21053,21061). predicate(#<==>,2,'P and Q are equivalent.',21063,21102). predicate(#==>,2,'P implies Q.',21104,21106). predicate(#<==,2,'Q implies P.',21108,21110). predicate(#/\,2,'P and Q hold.',21112,21114). predicate(#\/,2,'P or Q holds.',21116,21128). predicate(lex_chain,1,'Lists are lexicographically non-decreasing.',21130,21132). predicate(tuples_in,2,'Relation must be a list of lists of integers.',21134,21178). predicate(serialized,2,'Describes a set of non-overlapping tasks.',21180,21199). predicate(element,3,'The N-th element of the list of finite domain variables Vs is V.',21201,21204). predicate(global_cardinality,2,'Global Cardinality constraint.',21206,21216). predicate(global_cardinality,3,'Global Cardinality constraint.',21218,21235). predicate(circuit,1,'True if the list Vs of finite domain variables induces a Hamiltonian circuit.',21237,21251). predicate(cumulative,1,'Equivalent to cumulative(Tasks, [limit(1)]).',21253,21255). predicate(cumulative,2,'Tasks is a list of tasks, each of the form task(S_i, D_i, E_i, C_i, T_i).',21257,21290). predicate(automaton,3,'Describes a list of finite domain variables with a finite automaton.',21292,21318). predicate(automaton,8,'Describes a list of finite domain variables with a finite automaton.',21320,21386). predicate(transpose,2,'Invert the direction of all edges',21388,21448). predicate(zcompare,3,'Analogous to compare/3, with finite domain variables A and B.',21450,21475). predicate(chain,2,'Zs form a chain with respect to Relation.',21477,21488). predicate(fd_var,1,'True iff Var is a CLP(FD) variable.',21490,21492). predicate(fd_inf,2,'Inf is the infimum of the current domain of Var.',21494,21496). predicate(fd_sup,2,'Sup is the supremum of the current domain of Var.',21498,21500). predicate(fd_size,2,'Determine the size of a variable\'s domain.',21502,21506). predicate(fd_dom,2,'Dom is the current domain (see in/2) of Var.',21508,21514). predicate({},1,'DCG escape; constraints',21555,21557). predicate(entailed,1,'Check if constraint is entailed',21559,21563). predicate(inf,2,'Find the infimum of an expression',21565,21569). predicate(sup,2,'Find the supremum of an expression',21571,21575). predicate(minimize,1,'Minimizes an expression',21577,21581). predicate(maximize,1,'Maximizes an expression',21583,21587). predicate(bb_inf,5,'Infimum of expression for mixed-integer problems',21589,21598). predicate(bb_inf,4,'Infimum of expression for mixed-integer problems',21600,21603). predicate(bb_inf,3,'Infimum of expression for mixed-integer problems',21605,21608). predicate(dump,3,'Dump constraints on variables',21610,21620). predicate(csv_read_file,2,'Read a CSV file into a list of rows.',21755,21756). predicate(csv_read_file,3,'Read a CSV file into a list of rows.',21758,21774). predicate(csv,3,'Prolog DCG to `read/write\' CSV data.',21776,21777). predicate(csv,4,'Prolog DCG to `read/write\' CSV data.',21779,21812). predicate(csv_read_file_row,3,'True when Row is a row in File.',21814,21834). predicate(csv_write_file,2,'Write a list of Prolog terms to a CSV file.',21836,21837). predicate(csv_write_file,3,'Write a list of Prolog terms to a CSV file.',21839,21844). predicate(csv_write_stream,3,'Write the rows in Data to Stream.',21846,21860). predicate(debugging,1,'Test where we are debugging topic',21882,21883). predicate(debugging,1,'Test where we are debugging topic',21885,21886). predicate(debugging,2,'Examine debug topics.',21888,21902). predicate(debug,1,'Select topic for debugging',21904,21905). predicate(nodebug,1,'Disable debug-topic',21907,21916). predicate(list_debug_topics,0,'List registered topics for debugging',21918,21920). predicate(debug_message_context,1,'Specify additional context for debug messages.',21922,21928). predicate(debug,3,'Print debugging message on topic',21930,21943). predicate(debug_print_hook,3,'Hook called by debug/3.',21945,21951). predicate(assertion,1,'Make assertions about your program',21953,21966). predicate(assertion_failed,2,'This hook is called if the Goal of assertion/1 fails.',21968,21974). predicate(gensym,2,'Generate unique atoms from a base',21989,21994). predicate(reset_gensym,1,'Reset a gensym key',21996,22000). predicate(reset_gensym,0,'Reset all gensym keys',22002,22007). predicate(member,2,'True if Elem is a member of List.',22027,22037). predicate(append,3,'List1AndList2 is the concatenation of List1 and List2.',22039,22041). predicate(append,2,'Concatenate a list of lists.',22043,22049). predicate(prefix,2,'True iff Part is a leading substring of Whole.',22051,22054). predicate(select,3,'Is true when List1, with Elem removed, results in List2.',22056,22058). predicate(selectchk,3,'Semi-deterministic removal of first element in List that unifies with Elem.',22060,22063). predicate(select,4,'Select from two lists at the same positon.',22065,22081). predicate(selectchk,4,'Semi-deterministic version of select/4.',22083,22085). predicate(nextto,3,'True if Y follows X in List.',22087,22089). predicate(delete,3,'Delete matching elements from a list.',22091,22103). predicate(nth0,3,'True when Elem is the Index\'th element of List.',22105,22113). predicate(nth1,3,'Is true when Elem is the Index\'th element of List.',22115,22120). predicate(nth0,4,'Select/insert element at index.',22122,22139). predicate(nth1,4,'As nth0/4, but counting starts at 1.',22141,22143). predicate(last,2,'Last element of a list',22145,22153). predicate(proper_length,2,'True when Length is the number of elements in the proper list List.',22155,22164). predicate(same_length,2,'Is true when List1 and List2 are lists with the same number of elements.',22166,22173). predicate(reverse,2,'Is true when the elements of List2 are in reverse order compared to List1.',22175,22178). predicate(permutation,2,'True when Xs is a permutation of Ys.',22180,22211). predicate(flatten,2,'Is true if List2 is a non-nested version of List1.',22213,22223). predicate(max_member,2,'True when Max is the largest member in the standard order of terms.',22225,22232). predicate(min_member,2,'True when Min is the smallest member in the standard order of terms.',22234,22241). predicate(sum_list,2,'Sum is the result of adding all numbers in List.',22243,22245). predicate(max_list,2,'True if Max is the largest number in List.',22247,22251). predicate(min_list,2,'True if Min is the smallest number in List.',22253,22258). predicate(numlist,3,'List is a list [Low, Low+1, ... High].',22260,22266). predicate(is_set,1,'True if Set is a proper list without duplicates.',22268,22273). predicate(list_to_set,2,'Remove duplicates from a list',22275,22294). predicate(intersection,3,'True if Set3 unifies with the intersection of Set1 and Set2.',22296,22301). predicate(union,3,'True if Set3 unifies with the union of Set1 and Set2.',22303,22308). predicate(subset,2,'True if all elements of SubSet belong to Set as well.',22310,22315). predicate(subtract,3,'Delete all elements in Delete from Set.',22317,22322). predicate(empty_nb_set,1,'Test/create an empty non-backtrackable set',22351,22353). predicate(add_nb_set,2,'Add term to a non-backtrackable set',22355,22358). predicate(add_nb_set,3,'Add term to a non-backtrackable set',22360,22368). predicate(gen_nb_set,2,'Generate members of non-backtrackable set',22370,22373). predicate(size_nb_set,2,'Determine size of non-backtrackable set',22375,22377). predicate(nb_set_to_list,2,'Convert non-backtrackable set to list',22379,22382). predicate(www_open_url,1,'Open a web-page in a browser',22390,22410). predicate(option,3,'Get an Option Qfrom OptionList.',22465,22471). predicate(option,2,'Get an Option from OptionList.',22473,22480). predicate(select_option,3,'Get and remove Option from an option list.',22482,22486). predicate(select_option,4,'Get and remove Option with default value.',22488,22492). predicate(merge_options,3,'Merge two option lists.',22494,22501). predicate(meta_options,3,'Perform meta-expansion on options that are module-sensitive.',22503,22520). predicate(opt_arguments,3,'Extract commandline options according to a specification.',22827,22843). predicate(opt_parse,4,'Equivalent to opt_parse(OptsSpec, ApplArgs, Opts, PositionalArgs, []).',22845,22847). predicate(opt_parse,5,'Parse the arguments Args (as list of atoms) according to OptsSpec.',22849,22884). predicate(opt_help,2,'True when Help is a help string synthesized from OptsSpec.',22886,22888). predicate(is_ordset,1,'True if Term is an ordered set.',22919,22924). predicate(ord_empty,1,'True when List is the empty ordered set.',22926,22929). predicate(ord_seteq,2,'True if Set1 and Set2 have the same elements.',22931,22936). predicate(list_to_ord_set,2,'Transform a list into an ordered set.',22938,22941). predicate(ord_intersect,2,'True if both ordered sets have a non-empty intersection.',22943,22945). predicate(ord_disjoint,2,'True if Set1 and Set2 have no common elements.',22947,22950). predicate(ord_intersect,3,'Intersection holds the common elements of Set1 and Set2.',22952,22956). predicate(ord_intersection,2,'Intersection of a powerset.',22958,22963). predicate(ord_intersection,3,'Intersection holds the common elements of Set1 and Set2.',22965,22967). predicate(ord_intersection,4,'Intersection and difference between two ordered sets.',22969,22975). predicate(ord_add_element,3,'Insert an element into the set.',22977,22980). predicate(ord_del_element,3,'Delete an element from an ordered set.',22982,22985). predicate(ord_selectchk,3,'Selectchk/3, specialised for ordered sets.',22987,22997). predicate(ord_memberchk,2,'True if Element is a member of OrdSet, compared using ==.',22999,23010). predicate(ord_subset,2,'Is true if all elements of Sub are in Super.',23012,23014). predicate(ord_subtract,3,'Diff is the set holding all elements of InOSet that are not in NotInOSet.',23016,23019). predicate(ord_union,2,'True if Union is the union of all elements in the superset SetOfSets.',23021,23028). predicate(ord_union,3,'Union is the union of Set1 and Set2.',23030,23032). predicate(ord_union,4,'True iff ord_union(Set1, Set2, Union) and ord_subtract(Set2, Set1, New).',23034,23037). predicate(ord_symdiff,3,'Is true when Difference is the symmetric difference of Set1 and Set2.',23039,23057). predicate(pairs_keys_values,3,'True if Keys holds the keys of Pairs and Values the values.',23074,23082). predicate(pairs_values,2,'Remove the keys from a list of Key-Value pairs.',23084,23087). predicate(pairs_keys,2,'Remove the values from a list of Key-Value pairs.',23089,23092). predicate(group_pairs_by_key,2,'Group values with the same key.',23094,23110). predicate(transpose_pairs,2,'Swap Key-Value to Value-Key.',23112,23115). predicate(map_list_to_pairs,3,'Create a Key-Value list by mapping each element of List.',23117,23124). predicate(phrase_from_file,2,'Process the content of File using the DCG rule Grammar.',23156,23180). predicate(phrase_from_file,3,'As phrase_from_file/2, providing additional Options.',23182,23188). predicate(phrase_from_stream,2,'Helper for phrase_from_file/3.',23190,23193). predicate(syntax_error,3,'Throw the syntax error Error at the current location of the input.',23195,23201). predicate(lazy_list_location,3,'Determine current (error) location in a lazy list.',23203,23218). predicate(lazy_list_character_count,3,'True when CharCount is the current character count in the Lazy list.',23220,23231). predicate(stream_to_lazy_list,2,'Create a lazy list representing the character codes in Stream.',23233,23245). predicate(predicate_options,3,'Declare that the predicate PI processes options on Arg.',23387,23421). predicate(assert_predicate_options,4,'As predicate_options(:PI, +Arg, +Options).',23423,23431). predicate(current_predicate_option,3,'True when Arg of PI processes Option.',23433,23444). predicate(check_predicate_option,3,'Verify predicate options at runtime.',23446,23461). predicate(current_option_arg,2,'True when Arg of PI processes predicate options.',23463,23466). predicate(current_predicate_options,3,'True when Options is the current active option declaration for PI on Arg.',23468,23476). predicate(check_predicate_options,0,'Analyse loaded program for erroneous options.',23478,23494). predicate(derive_predicate_options,0,'Derive new predicate option declarations.',23496,23505). predicate(retractall_predicate_options,0,'Remove all dynamically (derived) predicate options.',23507,23509). predicate(derived_predicate_options,3,'Derive option arguments using static analysis.',23511,23514). predicate(derived_predicate_options,1,'Derive predicate option declarations for a module.',23516,23519). predicate(pack_list_installed,0,'List currently installed packages.',23539,23545). predicate(pack_info,1,'Print more detailed information about Pack.',23547,23549). predicate(pack_search,1,'Query package server and installed packages and display results.',23551,23552). predicate(pack_list,1,'Query package server and installed packages and display results.',23554,23586). predicate(pack_install,1,'Install a package.',23588,23606). predicate(pack_install,2,'Install package Name.',23608,23620). predicate(pack_rebuild,1,'Rebuilt possible foreign components of Pack.',23622,23624). predicate(pack_rebuild,0,'Rebuild foreign components of all packages.',23626,23628). predicate(environment,2,'Hook to define the environment for building packs.',23630,23646). predicate(pack_upgrade,1,'Try to upgrade the package Pack.',23648,23653). predicate(pack_remove,1,'Remove the indicated package.',23655,23657). predicate(pack_property,2,'True when Property is a property of Pack.',23659,23684). predicate(xref_source,1,'Cross-reference analysis of source',23719,23724). predicate(xref_current_source,1,'Examine cross-referenced sources',23726,23728). predicate(xref_clean,1,'Remove analysis of source',23730,23732). predicate(xref_defined,3,'Examine defined predicates',23734,23745). predicate(xref_called,3,'Examine called predicates',23747,23749). predicate(xref_exported,2,'Examine exported predicates',23751,23753). predicate(xref_module,2,'Module defined by source',23755,23757). predicate(xref_built_in,1,'Examine defined built-ins',23759,23764). predicate(called_by,2,'Hook (prolog) Extend cross-referencer',23772,23785). predicate(with_quasi_quotation_input,3,'',23865,23885). predicate(phrase_from_quasi_quotation,2,'',23887,23893). predicate(quasi_quotation_syntax,1,'',23895,23898). predicate(quasi_quotation_syntax_error,1,'',23900,23905). predicate(random,1,'Binds R to a new random float in the _open_ interval (0.0,1.0).',23919,23927). predicate(random_between,3,'Binds R to a random integer in [L,U] (i.e., including both L and U).',23929,23932). predicate(random,3,'Generate a random integer or float in a range.',23934,23935). predicate(random,3,'Generate a random integer or float in a range.',23937,23947). predicate(setrand,1,'Query/set the state of the random generator.',23949,23950). predicate(getrand,1,'Query/set the state of the random generator.',23952,23971). predicate(maybe,0,'Succeed/fail with equal probability (variant of maybe/1).',23973,23975). predicate(maybe,1,'Succeed with probability P, fail with probability 1-P.',23977,23979). predicate(maybe,2,'Succeed with probability K/N (variant of maybe/1).',23981,23983). predicate(random_perm2,4,'Does X=A,Y=B or X=B,Y=A with equal probability.',23985,23987). predicate(random_member,2,'X is a random member of List.',23989,23994). predicate(random_select,3,'Randomly select or insert an element.',23996,23997). predicate(random_select,3,'Randomly select or insert an element.',23999,24004). predicate(randset,3,'S is a sorted list of K unique random integers in the range 1..N.',24006,24021). predicate(randseq,3,'S is a list of K unique random integers in the range 1..N.',24023,24034). predicate(random_permutation,2,'Permutation is a random permutation of List.',24036,24037). predicate(random_permutation,2,'Permutation is a random permutation of List.',24039,24045). predicate(read_line_to_codes,2,'Read line from a stream',24058,24066). predicate(read_line_to_codes,3,'Read line from a stream',24068,24089). predicate(read_stream_to_codes,2,'Read contents of stream',24091,24093). predicate(read_stream_to_codes,3,'Read contents of stream',24095,24097). predicate(read_file_to_codes,3,'Read contents of file',24099,24105). predicate(read_file_to_terms,3,'Read contents of file to Prolog terms',24107,24113). predicate(record,1,'Define named fields in a term',24207,24212). predicate(registry_get_key,2,'Get principal value of key',24231,24234). predicate(registry_get_key,3,'Get associated value of key',24236,24238). predicate(registry_set_key,2,'Set principal value of key',24240,24243). predicate(registry_set_key,3,'Set associated value of key',24245,24248). predicate(registry_delete_key,1,'Remove a key',24250,24252). predicate(shell_register_file_type,4,'Register a file-type',24254,24260). predicate(shell_register_dde,6,'Register DDE action',24262,24269). predicate(shell_register_prolog,1,'Register Prolog',24271,24290). predicate(assignment,2,'Solve assignment problem',24315,24321). predicate(constraint,3,'Add linear constraint to state',24323,24333). predicate(constraint,4,'Add named linear constraint to state',24335,24338). predicate(constraint_add,4,'Extend a named constraint',24340,24344). predicate(gen_state,1,'Create empty linear program',24346,24349). predicate(maximize,3,'Maximize objective function in to linear constraints',24351,24356). predicate(minimize,3,'Minimize objective function in to linear constraints',24358,24360). predicate(objective,2,'Fetch value of objective function',24362,24365). predicate(shadow_price,3,'Fetch shadow price in solved state',24367,24371). predicate(transportation,4,'Solve transportation problem',24373,24381). predicate(variable_value,3,'Fetch value of variable in solved state',24383,24392). predicate(thread_pool_create,3,'Create a pool of threads.',24566,24583). predicate(thread_pool_destroy,1,'Destroy the thread pool named Name.',24585,24589). predicate(current_thread_pool,1,'True if Name refers to a defined thread pool.',24591,24593). predicate(thread_pool_property,2,'True if Property is a property of thread pool Name.',24595,24616). predicate(thread_create_in_pool,4,'Create a thread in Pool.',24618,24632). predicate(create_pool,1,'Hook to create a thread pool lazily.',24634,24648). predicate(vertices_edges_to_ugraph,3,'Create unweighted graph',24679,24697). predicate(vertices,2,'Find vertices in graph',24699,24705). predicate(edges,2,'Find edges in graph',24707,24714). predicate(add_vertices,3,'Add vertices to graph',24716,24724). predicate(del_vertices,3,'Delete vertices from graph',24726,24738). predicate(add_edges,3,'Add edges to graph',24740,24752). predicate(del_edges,3,'Delete edges from graph',24754,24764). predicate(transpose,2,'Invert the direction of all edges',24766,24777). predicate(neighbours,3,'Find neighbors of vertice',24779,24788). predicate(neighbors,3,'Find neighbors of vertice',24790,24792). predicate(complement,2,'Inverse presense of edges',24794,24804). predicate(compose,3,'',24806,24814). predicate(ugraph_union,3,'Union of two graphs',24816,24823). predicate(top_sort,2,'Sort graph topologically',24825,24835). predicate(top_sort,3,'Sort graph topologically',24837,24840). predicate(transitive_closure,2,'Create transitive closure of graph',24842,24850). predicate(reachable,3,'Find all reachable vertices',24852,24860). predicate(global_url,3,'Translate a possibly relative URL into an absolute one.',24883,24887). predicate(is_absolute_url,1,'True if URL is an absolute URL.',24889,24892). predicate(http_location,2,'Construct or analyze an HTTP location.',24894,24905). predicate(parse_url,2,'Construct or analyse a URL.',24907,24964). predicate(parse_url,3,'Similar to parse_url/2 for relative URLs.',24966,24969). predicate(www_form_encode,2,'En/decode to/from application/x-www-form-encoded.',24971,24972). predicate(www_form_encode,2,'En/decode to/from application/x-www-form-encoded.',24974,24985). predicate(set_url_encoding,2,'Query and set the encoding for URLs.',24987,24994). predicate(url_iri,2,'Convert between a URL, encoding in US-ASCII and an IRI.',24996,24997). predicate(url_iri,2,'Convert between a URL, encoding in US-ASCII and an IRI.',24999,25003). predicate(parse_url_search,2,'Construct or analyze an HTTP search specification.',25005,25009). predicate(file_name_to_url,2,'Translate between a filename and a file:Sidiv{} URL.',25011,25012). predicate(file_name_to_url,2,'Translate between a filename and a file:Sidiv{} URL.',25014,25019). predicate(numbervars,1,'Number variables in Term using $VAR(N).',25045,25050). predicate(varnumbers,2,'Inverse of numbervars/1.',25052,25054). predicate(varnumbers,3,'Inverse of numbervars/3.',25056,25067). predicate(max_var_number,3,'True when Max is the max of Start and the highest numbered $VAR(N) term.',25069,25076). predicate(prolog_current_frame,1,'Reference to goal\'s environment stack',25091,25097). predicate(prolog_current_choice,1,'Reference to most recent choice point',25099,25103). predicate(prolog_frame_attribute,3,'Obtain information on a goal environment',25105,25188). predicate(prolog_choice_attribute,3,'Examine the choice point stack',25190,25212). predicate(deterministic,1,'Test deterministicy of current clause',25214,25221). predicate(prolog_cut_to,1,'Realise global cuts',25226,25232). predicate(prolog_trace_interception,4,'library(user) Intercept the Prolog tracer',25325,25434). predicate(prolog_skip_frame,1,'Perform `skip\' on a frame',25436,25443). predicate(prolog_skip_level,2,'Indicate deepest recursion to trace',25445,25452). predicate(break_hook,6,'',25464,25541). predicate(prolog_exception_hook,4,'Rewrite exceptions',25551,25594). predicate(exception,3,'Hook (user) Handle runtime exceptions',25609,25635). predicate(prolog_list_goal,1,'Hook (user) Intercept tracer \'L\' command',25647,25653). predicate(debug_control_hook,1,'Hook (prolog) Extend spy/1, etc.',25655,25681). predicate(help_hook,1,'Hook (prolog) User-hook in the help-system',25683,25698). predicate(prolog_load_file,2,'Hook (user) Program load_files/2',25707,25718). predicate(comment_hook,3,'Hook (prolog) handle comments in sources',25720,25739). predicate(rl_read_init_file,1,'Read readline(3) init file',25749,25753). predicate(rl_add_history,1,'Add line to readline(3) history',25755,25758). predicate(rl_write_history,1,'Write readline(3) history',25760,25763). predicate(rl_read_history,1,'Read readline(3) history',25765,25767). predicate(expects_dialect,1,'For which Prolog dialect is this code written?',25810,25836). predicate(exists_source,1,'Check existence of a Prolog source',25838,25842). predicate(source_exports,2,'Check whether source exports a predicate',25844,25847). predicate(eval_license,0,'Evaluate licenses of loaded modules',26347,26353). predicate(license,2,'Define license for named module',26355,26407). predicate(license,1,'Define license for current file',26409,26412). % Predicate section/4 section([1],'INTRODUCTION',50,315). section([1,1],'Positioning SWI-Prolog',63,104). section([1,2],'Status and releases',106,132). section([1,3],'Should I be using SWI-Prolog?',134,217). section([1,4],'Support the SWI-Prolog project',219,229). section([1,5],'Implementation history',231,265). section([1,6],'Acknowledgements',267,315). section([2],'OVERVIEW',317,2951). section([2,1],'Getting started quickly',320,405). section([2,1,1],'Starting SWI-Prolog',323,378). section([2,1,1,1],'Starting SWI-Prolog on Unix',326,356). section([2,1,1,2],'Starting SWI-Prolog on Windows',358,378). section([2,1,2],'Executing a query',380,405). section([2,2],'The user\'s initialisation file',407,438). section([2,3],'Initialisation files and goals',440,473). section([2,4],'Command line options',475,706). section([2,4,1],'Informational command line options',510,538). section([2,4,2],'Command line options for running Prolog',540,625). section([2,4,3],'Controlling the stack sizes',627,656). section([2,4,4],'Running goals from the command line',658,680). section([2,4,5],'Compilation options',682,690). section([2,4,6],'Maintenance options',692,706). section([2,5],'GNU Emacs Interface',708,720). section([2,6],'Online Help',722,788). section([2,7],'Command line history',790,815). section([2,8],'Reuse of top-level bindings',817,856). section([2,9],'Overview of the Debugger',858,1027). section([2,10],'Compilation',1029,1220). section([2,10,1],'During program development',1032,1059). section([2,10,2],'For running the result',1061,1220). section([2,10,2,1],'Using PrologScript',1069,1137). section([2,10,2,2],'Creating a shell script',1139,1171). section([2,10,2,3],'Creating a saved state',1173,1184). section([2,10,2,4],'Compilation using the -c command line option',1186,1220). section([2,11],'Environment Control (Prolog flags)',1222,1972). section([2,12],'An overview of hook predicates',1974,2045). section([2,13],'Automatic loading of libraries',2047,2159). section([2,14],'Garbage Collection',2161,2166). section([2,15],'Syntax Notes',2168,2450). section([2,15,1],'ISO Syntax Support',2182,2450). section([2,15,1,1],'Processor Character Set',2187,2193). section([2,15,1,2],'Character Escape Syntax',2195,2305). section([2,15,1,3],'Syntax for non-decimal numbers',2307,2315). section([2,15,1,4],'Using digit groups in large integers',2317,2340). section([2,15,1,5],'Unicode Prolog source',2342,2387). section([2,15,1,6],'Singleton variable checking',2389,2450). section([2,16],'Rational trees (cyclic terms)',2452,2482). section([2,17],'Just-in-time clause indexing',2484,2577). section([2,17,1],'Future directions',2551,2562). section([2,17,2],'Indexing and portability',2564,2577). section([2,18],'Wide character support',2579,2701). section([2,18,1],'Wide character encodings on streams',2606,2701). section([2,18,1,1],'BOM: Byte Order Mark',2677,2701). section([2,19],'System limits',2703,2862). section([2,19,1],'Limits on memory areas',2706,2805). section([2,19,1,1],'The heap',2799,2805). section([2,19,2],'Other Limits',2807,2852). section([2,19,3],'Reserved Names',2854,2862). section([2,20],'SWI-Prolog and 64-bit machines',2864,2951). section([2,20,1],'Supported platforms',2871,2876). section([2,20,2],'Comparing 32- and 64-bits Prolog',2878,2910). section([2,20,3],'Choosing between 32- and 64-bit Prolog',2912,2951). section([3],'INITIALISING AND MANAGING A PROLOG PROJECT',2953,3727). section([3,1],'The project source files',2968,3134). section([3,1,1],'File Names and Locations',2978,3057). section([3,1,1,1],'File Name Extensions',2981,3002). section([3,1,1,2],'Project Directories',3004,3023). section([3,1,1,3],'Sub-projects using search paths',3025,3057). section([3,1,2],'Project Special Files',3059,3090). section([3,1,3],'International source files',3092,3134). section([3,2],'Using modules',3136,3179). section([3,3],'The test-edit-reload cycle',3181,3247). section([3,3,1],'Locating things to edit',3197,3215). section([3,3,2],'Editing and incremental compilation',3217,3247). section([3,4],'Using the PceEmacs built-in editor',3249,3504). section([3,4,1],'Activating PceEmacs',3252,3258). section([3,4,2],'Bluffing through PceEmacs',3260,3379). section([3,4,2,1],'Edit modes',3273,3296). section([3,4,2,2],'Frequently used editor commands',3298,3379). section([3,4,3],'Prolog Mode',3381,3504). section([3,4,3,1],'Finding your way around',3493,3504). section([3,5],'The Graphical Debugger',3506,3559). section([3,5,1],'Invoking the window-based debugger',3522,3559). section([3,6],'The Prolog Navigator',3561,3567). section([3,7],'Cross-referencer',3569,3650). section([3,8],'Accessing the IDE from your program',3652,3689). section([3,9],'Summary of the IDE',3691,3727). section([4],'BUILT-IN PREDICATES',3729,12319). section([4,1],'Notation of Predicate Descriptions',3732,3775). section([4,2],'Character representation',3777,3832). section([4,3],'Loading Prolog source files',3834,4848). section([4,3,1],'Conditional compilation and program transformation',4491,4683). section([4,3,1,1],'Program transformation with source layout info',4588,4619). section([4,3,1,2],'Conditional compilation',4621,4683). section([4,3,2],'Loading files, active code and threads',4685,4801). section([4,3,2,1],'Compilation of mutually dependent code',4719,4739). section([4,3,2,2],'Compilation with multiple threads',4741,4772). section([4,3,2,3],'Reloading running code',4774,4801). section([4,3,3],'Quick load files',4803,4848). section([4,4],'Editor Interface',4850,4976). section([4,4,1],'Customizing the editor interface',4890,4976). section([4,5],'List the program, predicates or clauses',4978,5009). section([4,6],'Verify Type of a Term',5011,5124). section([4,7],'Comparison and Unification of Terms',5126,5323). section([4,7,1],'Standard Order of Terms',5145,5199). section([4,7,2],'Special unification and comparison predicates',5201,5323). section([4,8],'Control Predicates',5325,5437). section([4,9],'Meta-Call Predicates',5439,5637). section([4,10],'ISO compliant Exception handling',5639,6015). section([4,10,1],'Debugging and exceptions',5683,5722). section([4,10,2],'The exception term',5724,5736). section([4,10,3],'Printing messages',5738,6015). section([4,10,3,1],'Printing from libraries',5950,6015). section([4,11],'Handling signals',6017,6110). section([4,11,1],'Notes on signal handling',6077,6110). section([4,12],'DCG Grammar rules',6112,6208). section([4,13],'Database',6210,6488). section([4,13,1],'Update view',6407,6426). section([4,13,2],'Indexing databases',6428,6488). section([4,14],'Declaring predicate properties',6490,6549). section([4,15],'Examining the program',6551,6853). section([4,16],'Input and output',6855,7574). section([4,16,1],'Predefined stream aliases',6869,6905). section([4,16,2],'ISO Input and Output Streams',6907,7372). section([4,16,3],'Edinburgh-style I/O',7374,7493). section([],'Compatibility notes',7422,29118). section([4,16,4],'Switching between Edinburgh and ISO I/O',7495,7519). section([4,16,5],'Write onto atoms, code-lists, etc.',7521,7574). section([4,17],'Status of streams',7576,7647). section([4,18],'Primitive character I/O',7649,7888). section([4,19],'Term reading and writing',7890,8329). section([4,20],'Analysing and Constructing Terms',8331,8522). section([4,20,1],'Non-logical operations on terms',8444,8522). section([4,21],'Analysing and Constructing Atoms',8524,8711). section([4,22],'Localization (locale) support',8713,8798). section([4,23],'Character properties',8800,8987). section([4,23,1],'Case conversion',8932,8949). section([4,23,2],'White space normalization',8951,8959). section([4,23,3],'Language-specific comparison',8961,8987). section([4,24],'Representing text in strings',8989,9076). section([4,25],'Operators',9078,9184). section([4,26],'Character Conversion',9186,9203). section([4,27],'Arithmetic',9205,9845). section([4,27,1],'Special purpose integer arithmetic',9215,9243). section([4,27,2],'General purpose arithmetic',9245,9845). section([4,27,2,1],'Arithmetic types',9291,9343). section([4,27,2,2],'Rational number examples',9345,9376). section([4,27,2,3],'Arithmetic Functions',9378,9845). section([4,28],'Misc arithmetic support predicates',9847,9895). section([4,29],'Built-in list operations',9897,9991). section([4,30],'Finding all Solutions to a Goal',9993,10052). section([4,31],'Forall',10054,10098). section([4,32],'Formatted Write',10100,10425). section([4,32,1],'Writef',10110,10190). section([4,32,2],'Format',10192,10386). section([4,32,3],'Programming Format',10388,10425). section([4,33],'Terminal Control',10427,10473). section([4,34],'Operating System Interaction',10475,11135). section([4,34,1],'Windows-specific Operating System Interaction',10599,10709). section([4,34,2],'Dealing with time and date',10711,11073). section([4,34,2,1],'Time and date data structures',10750,10778). section([4,34,2,2],'Time and date predicates',10780,11073). section([4,34,3],'Controlling the swipl-win.exe console window',11075,11135). section([4,35],'File System Interaction',11137,11413). section([4,36],'User Top-level Manipulation',11415,11509). section([4,37],'Creating a Protocol of the User Interaction',11511,11536). section([4,38],'Debugging and Tracing Programs',11538,11752). section([4,39],'Obtaining Runtime Statistics',11754,11858). section([4,40],'Execution profiling',11860,12035). section([4,40,1],'Profiling predicates',11871,11937). section([4,40,2],'Visualizing profiling data',11939,11986). section([4,40,3],'Information gathering',11988,12035). section([4,40,3,1],'Profiling in the Windows Implementation',12020,12035). section([4,41],'Memory Management',12037,12123). section([4,42],'Windows DDE interface',12125,12259). section([4,42,1],'DDE client interface',12141,12198). section([4,42,2],'DDE server mode',12200,12259). section([4,43],'Miscellaneous',12261,12319). section([5],'MODULES',12321,13140). section([5,1],'Why Use Modules?',12348,12368). section([5,2],'Defining a Module',12370,12424). section([5,3],'Importing Predicates into a Module',12426,12512). section([5,4],'Defining a meta-predicate',12514,12642). section([5,5],'Overruling Module Boundaries',12644,12701). section([5,5,1],'Explicit manipulation of the calling context',12676,12701). section([5,6],'Interacting with modules from the top level',12703,12731). section([5,7],'Composing modules from other modules',12733,12764). section([5,8],'Operators and modules',12766,12796). section([5,9],'Dynamic importing using import modules',12798,12846). section([5,10],'Reserved Modules and using the `user\' module',12848,12863). section([5,11],'An alternative import/export interface',12865,12890). section([5,12],'Dynamic Modules',12892,12925). section([5,13],'Transparent predicates: definition and context module',12927,13018). section([5,14],'Module properties',13020,13083). section([5,15],'Compatibility of the Module System',13085,13140). section([6],'SPECIAL VARIABLES AND COROUTINING',13142,13590). section([6,1],'Attributed variables',13189,13396). section([6,1,1],'Attribute manipulation predicates',13273,13305). section([6,1,2],'Attributed variable hooks',13307,13341). section([6,1,3],'Operations on terms with attributed variables',13343,13372). section([6,1,4],'Special purpose predicates for attributes',13374,13396). section([6,2],'Coroutining',13398,13473). section([6,3],'Global variables',13475,13590). section([6,3,1],'Compatibility of SWI-Prolog Global Variables',13577,13590). section([7],'CHR: CONSTRAINT HANDLING RULES',13592,14469). section([7,1],'Introduction',13614,13642). section([7,2],'Syntax and Semantics',13644,13821). section([7,2,1],'Syntax of CHR rules',13647,13699). section([7,2,2],'Semantics',13701,13821). section([7,3],'CHR in SWI-Prolog Programs',13823,14069). section([7,3,1],'Embedding in Prolog Programs',13826,13831). section([7,3,2],'Constraint declaration',13833,14042). section([7,3,3],'Compilation',14044,14069). section([7,4],'Debugging',14071,14212). section([7,4,1],'Ports',14081,14122). section([7,4,2],'Tracing',14124,14171). section([7,4,3],'CHR Debugging Predicates',14173,14212). section([7,5],'Examples',14214,14273). section([7,6],'Backwards Compatibility',14275,14353). section([7,6,1],'The Old SICStus CHR implemenation',14278,14321). section([7,6,2],'The Old ECLiPSe CHR implemenation',14323,14353). section([7,7],'Programming Tips and Tricks',14355,14398). section([7,8],'Compiler Errors and Warnings',14400,14469). section([7,8,1],'CHR Compiler Errors',14406,14469). section([8],'MULTITHREADED APPLICATIONS',14471,15486). section([8,1],'Creating and destroying Prolog threads',14507,14688). section([8,2],'Monitoring threads',14690,14760). section([8,3],'Thread communication',14762,15035). section([8,3,1],'Message queues',14765,14953). section([8,3,2],'Signalling threads',14955,14986). section([8,3,3],'Threads and dynamic predicates',14988,15035). section([8,4],'Thread synchronisation',15037,15152). section([8,5],'Thread support library(threadutil)',15154,15259). section([8,5,1],'Debugging threads',15180,15244). section([8,5,2],'Profiling threads',15246,15259). section([8,6],'Multithreaded mixed C and Prolog applications',15261,15430). section([8,6,1],'A Prolog thread for each native thread (one-to-one)',15283,15363). section([8,6,2],'Pooling Prolog engines (many-to-many)',15365,15430). section([8,7],'Multithreading and the XPCE graphics system',15432,15486). section([9],'FOREIGN LANGUAGE INTERFACE',15488,19516). section([9,1],'Overview of the Interface',15507,15532). section([9,2],'Linking Foreign Modules',15534,15801). section([9,2,1],'What linking is provided?',15545,15553). section([9,2,2],'What kind of loading should I be using?',15555,15571). section([9,2,3],'library(shlib): Utility library for loading foreign objects',15573,15696). section([9,2,4],'Low-level operations on shared libraries',15698,15739). section([9,2,5],'Static Linking',15741,15801). section([9,3],'Interface Data Types',15803,15969). section([9,3,1],'Type term_t: a reference to a Prolog term',15806,15920). section([9,3,1,1],'Interaction with the garbage collector and stack-shifter',15909,15920). section([9,3,2],'Other foreign interface types',15922,15969). section([9,4],'The Foreign Include File',15971,19047). section([9,4,1],'Argument Passing and Control',15974,16113). section([9,4,1,1],'Non-deterministic Foreign Predicates',15993,16113). section([9,4,2],'Atoms and functors',16115,16201). section([9,4,2,1],'Atoms and atom garbage collection',16167,16201). section([9,4,3],'Analysing Terms via the Foreign Interface',16203,16758). section([9,4,3,1],'Testing the type of a term',16216,16324). section([9,4,3,2],'Reading data from a term',16326,16517). section([9,4,3,3],'Exchanging text using length and string',16519,16583). section([9,4,3,4],'Wide-character versions',16585,16632). section([9,4,3,5],'Reading a list',16634,16704). section([9,4,3,6],'An example: defining write/1 in C',16706,16758). section([9,4,4],'Constructing Terms',16760,16900). section([9,4,5],'Unifying data',16902,17292). section([9,4,6],'Convenient functions to generate Prolog exceptions',17294,17445). section([9,4,7],'BLOBS: Using atoms to store arbitrary binary data',17447,17596). section([9,4,7,1],'Defining a BLOB type',17469,17556). section([9,4,7,2],'Accessing blobs',17558,17596). section([9,4,8],'Exchanging GMP numbers',17598,17682). section([9,4,9],'Calling Prolog from C',17684,17833). section([9,4,9,1],'Predicate references',17697,17724). section([9,4,9,2],'Initiating a query from C',17726,17833). section([9,4,10],'Discarding Data',17835,17895). section([9,4,11],'Foreign Code and Modules',17897,17936). section([9,4,12],'Prolog exceptions in foreign code',17938,18065). section([9,4,13],'Catching Signals (Software Interrupts)',18067,18140). section([9,4,14],'Miscellaneous',18142,18302). section([9,4,14,1],'Term Comparison',18145,18156). section([9,4,14,2],'Recorded database',18158,18251). section([9,4,14,3],'Getting file names',18253,18302). section([9,4,15],'Errors and warnings',18304,18317). section([9,4,16],'Environment Control from Foreign Code',18319,18400). section([9,4,17],'Querying Prolog',18402,18439). section([9,4,18],'Registering Foreign Predicates',18441,18565). section([9,4,19],'Foreign Code Hooks',18567,18652). section([9,4,20],'Storing foreign data',18654,18846). section([9,4,20,1],'Examples for storing foreign data',18724,18846). section([9,4,21],'Embedding SWI-Prolog in other applications',18848,19047). section([9,4,21,1],'Threading, Signals and embedded Prolog',19008,19047). section([9,5],'Linking embedded applications using swipl-ld',19049,19268). section([9,5,1],'A simple example',19182,19268). section([9,6],'The Prolog `home\' directory',19270,19304). section([9,7],'Example of Using the Foreign Interface',19306,19365). section([9,8],'Notes on Using Foreign Code',19367,19516). section([9,8,1],'Memory Allocation',19370,19432). section([9,8,1,1],'Boehm-GC support',19402,19432). section([9,8,2],'Compatibility between Prolog versions',19434,19446). section([9,8,3],'Debugging and profiling foreign code (valgrind)',19448,19468). section([9,8,4],'Name Conflicts in C modules',19470,19487). section([9,8,5],'Compatibility of the Foreign Interface',19489,19516). section([10],'GENERATING RUNTIME APPLICATIONS',19518,19924). section([10,1],'Limitations of qsave_program',19669,19685). section([10,2],'Runtimes and Foreign Code',19687,19753). section([10,3],'Using program resources',19755,19877). section([10,3,1],'Resource manipulation predicates',19788,19846). section([10,3,2],'The swipl-rc program',19848,19877). section([10,4],'Finding Application files',19879,19924). section([10,4,1],'Specifying a file search path from the command line',19911,19924). section([11],'THE SWI-PROLOG LIBRARY',19926,25076). section([11,1],'library(aggregate): Aggregation operators on backtrackable',19950,20111). section([11,2],'library(apply): Apply predicates on a list',20113,20211). section([11,3],'library(assoc): Association lists',20213,20298). section([11,4],'library(broadcast): Broadcast and receive event notifications',20300,20414). section([11,5],'library(charsio): I/O on Lists of Character Codes',20416,20503). section([11,6],'library(check): Elementary completeness checks',20505,20561). section([11,7],'library(clpfd): Constraint Logic Programming over Finite Domains',20563,21514). section([11,7,0,1],'Introduction',20568,20596). section([11,7,0,2],'Arithmetic constraints',20598,20631). section([11,7,0,3],'Reification',20633,20650). section([11,7,0,4],'Examples',20652,20695). section([11,7,0,5],'Search',20697,20757). section([11,7,0,6],'Declarative integer arithmetic',20759,21514). section([11,8],'library(clpqr): Constraint Logic Programming over Rationals and',21516,21738). section([11,8,1],'Solver predicates',21550,21620). section([11,8,2],'Syntax of the predicate arguments',21622,21661). section([11,8,3],'Use of unification',21663,21680). section([11,8,4],'Non-linear constraints',21682,21707). section([11,8,5],'Status and known problems',21709,21738). section([11,9],'library(csv): Process CSV (Comma-Separated Values) data',21740,21860). section([11,10],'library(debug): Print debug messages and test assertions',21862,21974). section([11,11],'library(gensym): Generate unique identifiers',21976,22007). section([11,12],'library(lists): List Manipulation',22009,22322). section([11,13],'library(nb_set): Non-backtrackable set',22324,22382). section([11,14],'library(www_browser): Activating your Web-browser',22384,22410). section([11,15],'library(option): Option list processing',22412,22520). section([11,16],'library(optparse): command line parsing',22522,22888). section([11,16,1],'Notes and tips',22786,22888). section([11,17],'library(ordsets): Ordered set manipulation',22890,23057). section([11,18],'library(pairs): Operations on key-value lists',23059,23124). section([11,19],'library(pio): Pure I/O',23126,23245). section([11,19,1],'library(pure_input): Pure Input from files',23134,23245). section([11,20],'library(predicate_options): Declare option-processing of predi-',23247,23519). section([11,20,1],'The strength and weakness of predicate options',23253,23303). section([11,20,2],'Options as arguments or environment?',23305,23337). section([11,20,3],'Improving on the current situation',23339,23519). section([11,20,3,1],'Options as types',23349,23376). section([11,20,3,2],'Reflective access to options',23378,23519). section([11,21],'library(prolog_pack): A package manager for Prolog',23521,23684). section([11,22],'library(prolog_xref): Cross-reference data collection library',23686,23785). section([11,22,1],'Extending the library',23766,23785). section([11,23],'library(quasi_quotations): Define Quasi Quotation syntax',23787,23905). section([11,24],'library(random): Random numbers',23907,24045). section([11,25],'library(readutil): Reading lines, streams and files',24047,24113). section([11,26],'library(record): Access named fields in a term',24115,24212). section([11,27],'library(registry): Manipulating the Windows registry',24214,24290). section([11,28],'library(simplex): Solve linear programming problems',24292,24528). section([11,28,1],'Example 1',24394,24426). section([11,28,2],'Example 2',24428,24486). section([11,28,3],'Example 3',24488,24528). section([11,29],'library(thread_pool): Resource bounded thread management',24530,24648). section([11,30],'library(ugraphs): Unweighted Graphs',24650,24860). section([11,31],'library(url): Analysing and constructing URL',24862,25019). section([11,32],'library(varnumbers): Utilities for numbered terms',25021,25076). section([12],'HACKERS CORNER',25078,25767). section([12,1],'Examining the Environment Stack',25088,25221). section([12,2],'Ancestral cuts',25223,25232). section([12,3],'Syntax extensions',25234,25320). section([12,3,1],'Block operators',25281,25320). section([12,4],'Intercepting the Tracer',25322,25452). section([12,5],'Breakpoint and watchpoint handling',25454,25541). section([12,6],'Adding context to errors: prolog_exception_hook',25543,25594). section([12,7],'Hooks using the exception predicate',25596,25635). section([12,8],'Hooks for integrating libraries',25637,25698). section([12,9],'Hooks for loading files',25700,25739). section([12,10],'Readline Interaction',25741,25767). section([13],'COMPATIBILITY WITH OTHER PROLOG DIALECTS',25769,25964). section([13,1],'Some considerations for writing portable code',25849,25964). section([14],'GLOSSARY OF TERMS',25966,26258). section([15],'SWI-PROLOG LICENSE CONDITIONS AND TOOLS',26260,26453). section([15,1],'The SWI-Prolog kernel and foreign libraries',26290,26322). section([15,1,1],'The SWI-Prolog Prolog libraries',26305,26322). section([15,2],'Contributing to the SWI-Prolog project',26324,26334). section([15,3],'Software support to keep track of license conditions',26336,26417). section([15,4],'License conditions inherited from used code',26419,26453). section([15,4,1],'Cryptographic routines',26422,26453). section([16],'SUMMARY',26455,27815). section([16,1],'Predicates',26458,27205). section([16,2],'Library predicates',27207,27669). section([16,2,1],'library(aggregate)',27210,27219). section([16,2,2],'library(apply)',27221,27241). section([16,2,3],'library(assoc)',27243,27260). section([16,2,4],'library(broadcast)',27262,27272). section([16,2,5],'library(charsio)',27274,27291). section([16,2,6],'library(check)',27293,27299). section([16,2,7],'library(csv)',27301,27311). section([16,2,8],'library(lists)',27313,27351). section([16,2,9],'library(debug)',27353,27366). section([16,2,10],'library(option)',27368,27376). section([16,2,11],'library(optparse)',27378,27384). section([16,2,12],'library(ordsets)',27386,27410). section([16,2,13],'library(predicate_options)',27412,27426). section([16,2,14],'library(prologpack)',27428,27443). section([16,2,15],'library(prologxref)',27445,27457). section([16,2,16],'library(pairs)',27459,27467). section([16,2,17],'library(pio)',27469,27481). section([16,2,17,1],'library(pure_input)',27472,27481). section([16,2,18],'library(random)',27483,27500). section([16,2,19],'library(readutil)',27502,27510). section([16,2,20],'library(record)',27512,27515). section([16,2,21],'library(registry)',27517,27529). section([16,2,22],'library(ugraphs)',27531,27552). section([16,2,23],'library(url)',27554,27567). section([16,2,24],'library(www_browser)',27569,27572). section([16,2,25],'library(clp/clpfd)',27574,27621). section([16,2,26],'library(clpqr)',27623,27635). section([16,2,27],'library(clp/simplex)',27637,27651). section([16,2,28],'library(thread_pool)',27653,27661). section([16,2,29],'library(varnumbers)',27663,27669). section([16,3],'Arithmetic Functions',27671,27748). section([16,4],'Operators',27750,27815). section([17],'Bibliography',27817,29118). section([],'Index',27916,29118). % Predicate function/3 function('PL_thread_self',15294,15299). function('PL_unify_thread_id',15301,15305). function('PL_thread_attach_engine',15307,15341). function('PL_thread_destroy_engine',15343,15353). function('PL_thread_at_exit',15355,15363). function('PL_create_engine',15392,15401). function('PL_destroy_engine',15403,15408). function('PL_set_engine',15410,15430). function('PL_new_term_ref',15866,15872). function('PL_new_term_refs',15874,15889). function('PL_copy_term_ref',15891,15895). function('PL_reset_term_refs',15897,15907). function('PL_succeed',15984,15986). function('PL_fail',15988,15991). function('PL_retry',16042,16051). function('PL_retry_address',16053,16057). function('PL_foreign_control',16059,16064). function('PL_foreign_context',16066,16071). function('PL_foreign_context_address',16073,16113). function('PL_new_atom',16121,16129). function('PL_atom_chars',16144,16152). function('PL_new_functor',16154,16157). function('PL_functor_name',16159,16161). function('PL_functor_arity',16163,16165). function('PL_register_atom',16180,16184). function('PL_unregister_atom',16186,16201). function('PL_term_type',16219,16262). function('PL_is_variable',16264,16266). function('PL_is_ground',16268,16271). function('PL_is_atom',16273,16275). function('PL_is_string',16277,16279). function('PL_is_integer',16281,16283). function('PL_is_float',16285,16287). function('PL_is_callable',16289,16292). function('PL_is_compound',16294,16296). function('PL_is_functor',16298,16302). function('PL_is_list',16304,16307). function('PL_is_pair',16309,16312). function('PL_is_atomic',16314,16316). function('PL_is_number',16318,16320). function('PL_is_acyclic',16322,16324). function('PL_get_atom',16333,16340). function('PL_get_atom_chars',16342,16347). function('PL_get_string_chars',16349,16355). function('PL_get_chars',16357,16439). function('PL_get_list_chars',16441,16444). function('PL_get_integer',16446,16450). function('PL_get_long',16452,16458). function('PL_get_int64',16460,16465). function('PL_get_intptr',16467,16472). function('PL_get_bool',16474,16477). function('PL_get_pointer',16479,16485). function('PL_get_float',16487,16489). function('PL_get_functor',16491,16495). function('PL_get_name_arity',16497,16501). function('PL_get_module',16503,16507). function('PL_get_arg',16509,16512). function('_PL_get_arg',16514,16517). function('PL_get_atom_nchars',16528,16530). function('PL_get_list_nchars',16532,16534). function('PL_get_nchars',16536,16538). function('PL_put_atom_nchars',16540,16542). function('PL_put_string_nchars',16544,16546). function('PL_put_list_ncodes',16548,16550). function('PL_put_list_nchars',16552,16554). function('PL_unify_atom_nchars',16556,16558). function('PL_unify_string_nchars',16560,16562). function('PL_unify_list_ncodes',16564,16566). function('PL_unify_list_nchars',16568,16573). function('PL_new_atom_nchars',16575,16579). function('PL_atom_nchars',16581,16583). function('PL_new_atom_wchars',16598,16603). function('PL_atom_wchars',16605,16611). function('PL_get_wchars',16613,16616). function('PL_unify_wchars',16618,16622). function('PL_unify_wchars_diff',16624,16632). function('PL_get_list',16661,16664). function('PL_get_head',16666,16668). function('PL_get_tail',16670,16672). function('PL_get_nil',16674,16676). function('PL_skip_list',16678,16704). function('PL_put_variable',16772,16775). function('PL_put_atom',16777,16780). function('PL_put_bool',16782,16785). function('PL_put_atom_chars',16787,16791). function('PL_put_string_chars',16793,16796). function('PL_put_string_nchars',16798,16802). function('PL_put_list_chars',16804,16806). function('PL_put_integer',16808,16810). function('PL_put_int64',16812,16814). function('PL_put_pointer',16816,16819). function('PL_put_float',16821,16823). function('PL_put_functor',16825,16830). function('PL_put_list',16832,16834). function('PL_put_nil',16836,16838). function('PL_put_term',16840,16842). function('PL_cons_functor',16844,16869). function('PL_cons_functor_v',16871,16876). function('PL_cons_list',16878,16900). function('PL_unify',16950,16982). function('PL_unify_atom',16984,16986). function('PL_unify_bool',16988,16990). function('PL_unify_chars',16992,17005). function('PL_unify_atom_chars',17007,17010). function('PL_unify_list_chars',17012,17014). function('PL_unify_string_chars',17016,17020). function('PL_unify_string_nchars',17022,17026). function('PL_unify_integer',17028,17030). function('PL_unify_int64',17032,17034). function('PL_unify_float',17036,17038). function('PL_unify_pointer',17040,17043). function('PL_unify_functor',17045,17050). function('PL_unify_list',17052,17083). function('PL_unify_nil',17085,17087). function('PL_unify_arg',17089,17091). function('PL_unify_term',17093,17244). function('PL_chars_to_term',17246,17277). function('PL_wchars_to_term',17279,17281). function('PL_quote',17283,17292). function('PL_get_atom_ex',17324,17327). function('PL_get_integer_ex',17329,17333). function('PL_get_long_ex',17335,17339). function('PL_get_int64_ex',17341,17345). function('PL_get_intptr_ex',17347,17351). function('PL_get_size_ex',17353,17357). function('PL_get_bool_ex',17359,17362). function('PL_get_float_ex',17364,17367). function('PL_get_char_ex',17369,17373). function('PL_get_pointer_ex',17375,17378). function('PL_get_list_ex',17380,17383). function('PL_get_nil_ex',17385,17388). function('PL_unify_list_ex',17390,17393). function('PL_unify_nil_ex',17395,17398). function('PL_unify_bool_ex',17400,17410). function('PL_instantiation_error',17412,17415). function('PL_uninstantiation_error',17417,17420). function('PL_representation_error',17422,17424). function('PL_type_error',17426,17428). function('PL_domain_error',17430,17432). function('PL_existence_error',17434,17436). function('PL_permission_error',17438,17441). function('PL_resource_error',17443,17445). function('PL_unregister_blob_type',17548,17556). function('PL_is_blob',17566,17569). function('PL_unify_blob',17571,17574). function('PL_put_blob',17576,17584). function('PL_get_blob',17586,17590). function('PL_blob_data',17592,17596). function('PL_get_mpz',17656,17662). function('PL_get_mpq',17664,17671). function('PL_unify_mpz',17673,17676). function('PL_unify_mpq',17678,17682). function('PL_pred',17705,17710). function('PL_predicate',17712,17715). function('PL_predicate_info',17717,17724). function('PL_open_query',17738,17801). function('PL_next_solution',17803,17808). function('PL_cut_query',17810,17814). function('PL_close_query',17816,17819). function('PL_call_predicate',17821,17825). function('PL_call',17827,17833). function('PL_open_foreign_frame',17844,17850). function('PL_close_foreign_frame',17852,17856). function('PL_discard_foreign_frame',17858,17861). function('PL_rewind_foreign_frame',17863,17895). function('PL_context',17903,17906). function('PL_strip_module',17908,17928). function('PL_module_name',17930,17932). function('PL_new_module',17934,17936). function('PL_raise_exception',18013,18040). function('PL_throw',18042,18045). function('PL_exception',18047,18059). function('PL_clear_exception',18061,18065). function('PL_signal',18087,18113). function('PL_raise',18115,18119). function('PL_handle_signals',18121,18132). function('PL_get_signum_ex',18134,18140). function('PL_compare',18148,18151). function('PL_same_compound',18153,18156). function('PL_record',18176,18181). function('PL_recorded',18183,18189). function('PL_erase',18191,18226). function('PL_record_external',18228,18240). function('PL_recorded_external',18242,18246). function('PL_erase_external',18248,18251). function('PL_get_file_name',18261,18294). function('PL_get_file_nameW',18296,18302). function('PL_warning',18312,18317). function('PL_action',18322,18376). function('PL_backtrace',18378,18400). function('PL_query',18405,18439). function('PL_register_foreign_in_module',18444,18517). function('PL_register_foreign',18519,18522). function('PL_register_extensions_in_module',18524,18560). function('PL_register_extensions',18562,18565). function('PL_dispatch_hook',18572,18582). function('PL_abort_hook',18584,18593). function('PL_abort_unhook',18595,18598). function('PL_on_halt',18600,18608). function('PL_exit_hook',18610,18613). function('PL_agc_hook',18615,18652). function('PL_initialise',18883,18939). function('PL_is_initialised',18941,18947). function('PL_install_readline',18949,18954). function('PL_toplevel',18956,18959). function('PL_cleanup',18961,18985). function('PL_cleanup_fork',18987,19000). function('PL_halt',19002,19006). function('PL_malloc',19384,19389). function('PL_realloc',19391,19395). function('PL_free',19397,19400). function('PL_malloc_atomic',19412,19413). function('PL_malloc_uncollectable',19415,19416). function('PL_malloc_atomic_uncollectable',19418,19424). function('PL_malloc_stubborn',19426,19427). function('PL_end_stubborn_change',19429,19432). function('PL_license',26414,26417).