- action_abort() - Static method in class org.jpl7.fli.Prolog
-  
- allSolutions() - Method in class org.jpl7.Query
- 
calls the Query's goal to exhaustion and returns an array of zero or more
 Maps of zero or more variablename-to-term bindings (each Map represents a
 solution, in the order in which they were found). 
- allSolutions(Term) - Static method in class org.jpl7.Query
- 
This static method creates a Query whose goal is the given Term, calls it
 to exhaustion, and returns an array of zero or more Maps of zero or more
 variablename-to-term bindings (each Map represents a solution, in the
 order in which they were found). 
- allSolutions(String) - Static method in class org.jpl7.Query
- 
This static method creates a Query from the given Prolog source text
 fragment, calls it to exhaustion, and returns an array of zero or more
 Maps of zero or more variablename-to-term bindings (each Map represents a
 solution, in the order in which they were found). 
- allSolutions(String, Term[]) - Static method in class org.jpl7.Query
- 
If text denotes (in traditional Prolog source syntax) a term containing N
 questionmark (?) symbols and there are N accompanying Term params, this
 static method replaces each questionmark symbol by its respective param,
 calls the resulting goal to exhaustion, and returns an array of zero or
 more Maps of zero or more variablename-to-term bindings (each Map
 represents a solution, in the order in which they were found). 
- arg(int) - Method in class org.jpl7.Compound
- 
Returns the ith argument (counting from 1) of this Compound. 
- arg(int) - Method in class org.jpl7.Term
- 
returns the i-th (1+) argument of a Term;
 defined only for Compound 
- args() - Method in class org.jpl7.Atom
-  
- args - Variable in class org.jpl7.Compound
- 
The (zero or more) arguments of this Compound. 
- args() - Method in class org.jpl7.Compound
- 
Returns the arguments of this Compound as a Term[0..arity-1] array. 
- args() - Method in class org.jpl7.Float
-  
- args() - Method in class org.jpl7.Integer
-  
- args() - Method in class org.jpl7.Rational
-  
- args() - Method in class org.jpl7.Term
- 
The arguments of this Term. 
- args() - Method in class org.jpl7.Variable
-  
- arity() - Method in class org.jpl7.Compound
- 
Returns the arity (0+) of this Compound. 
- arity() - Method in class org.jpl7.Term
- 
the arity of a Compound, Atom, Integer or Float 
- arity() - Method in class org.jpl7.Variable
- 
returns, as an int, the arity of a Term 
- Atom - Class in org.jpl7
- 
Atom is a specialised Term, representing a Prolog atom with the same name. 
- Atom(String) - Constructor for class org.jpl7.Atom
- 
This constructs a "text" Atom, and is equivalent to 
- Atom(String, String) - Constructor for class org.jpl7.Atom
-  
- ATOM - Static variable in class org.jpl7.fli.Prolog
-  
- atom_chars(atom_t) - Static method in class org.jpl7.fli.Prolog
-  
- atom_t - Class in org.jpl7.fli
- 
An atom_t is a specialised LongHolder which decrements its atom's reference
 count when garbage-collected (finalized). 
- atom_t() - Constructor for class org.jpl7.fli.atom_t
-  
- atomListToStringArray(Term) - Static method in class org.jpl7.Term
- 
Converts a term representing a list of atoms into an array of Strings, each element
 in the array being a String for the corresponding atom
        e.g., [a, b, 1 
- atomListToStringArray(Term) - Static method in class org.jpl7.Util
- 
- atomType() - Method in class org.jpl7.Atom
-  
- atomType() - Method in class org.jpl7.JRef
-  
- atomType() - Method in class org.jpl7.Term
-  
- attach_engine(engine_t) - Static method in class org.jpl7.fli.Prolog
-  
- attach_pool_engine() - Static method in class org.jpl7.fli.Prolog
-  
- halt(int) - Static method in class org.jpl7.fli.Prolog
-  
- halt() - Static method in class org.jpl7.JPL
- 
Deprecated.  
- hasFunctor(String, int) - Method in class org.jpl7.Atom
- 
Tests whether this Compound's functor has (String) 'name' and 'arity'. 
- hasFunctor(String, int) - Method in class org.jpl7.Compound
- 
Tests whether this Compound's functor has (String) 'name' and 'arity'. 
- hasFunctor(Term, int) - Method in class org.jpl7.Dict
- 
whether this Dictionary's functor has 'name' and 'arity' (c.f. 
- hasFunctor(double, int) - Method in class org.jpl7.Float
- 
Tests whether this Float's functor has (double) 'name' and 'arity' 
- hasFunctor(long, int) - Method in class org.jpl7.Integer
- 
whether this Integer's functor has (long) 'name' and 'arity' (c.f. 
- hasFunctor(BigInteger, int) - Method in class org.jpl7.Integer
- 
whether this Integer's functor has (BigInteger) 'name' and 'arity' (c.f. 
- hasFunctor(String, int) - Method in class org.jpl7.JRef
-  
- hasFunctor(long, int) - Method in class org.jpl7.Rational
- 
whether this Rational's functor has (long) 'name' and 'arity' (c.f. 
- hasFunctor(String, int) - Method in class org.jpl7.Term
- 
Whether this Term's functor has 'name' and 'arity' (c.f. 
- hasFunctor(long, int) - Method in class org.jpl7.Term
- 
Tests whether this Term's functor has 'name' and 'arity' 
- hasFunctor(BigInteger, int) - Method in class org.jpl7.Term
- 
Tests whether this Term's functor has 'name' and 'arity' 
- hasFunctor(double, int) - Method in class org.jpl7.Term
- 
Tests whether this Term's functor has 'name' and 'arity' 
- hasFunctor(BigInteger, int) - Method in class org.jpl7.Variable
-  
- hasFunctor(String, int) - Method in class org.jpl7.Variable
-  
- hasFunctor(long, int) - Method in class org.jpl7.Variable
-  
- hasFunctor(double, int) - Method in class org.jpl7.Variable
-  
- hashCode() - Method in class org.jpl7.Atom
-  
- hashCode() - Method in class org.jpl7.Compound
-  
- hashCode() - Method in class org.jpl7.Dict
-  
- hashCode() - Method in class org.jpl7.fli.LongHolder
-  
- hashCode() - Method in class org.jpl7.Float
-  
- hashCode() - Method in class org.jpl7.Integer
-  
- hashCode() - Method in class org.jpl7.JRef
-  
- hashCode() - Method in class org.jpl7.Rational
-  
- hashCode() - Method in class org.jpl7.Variable
-  
- hasMoreElements() - Method in class org.jpl7.Query
- 
This method implements part of the java.util.Enumeration interface. 
- hasMoreSolutions() - Method in class org.jpl7.Query
- 
This method returns true if JPL was able to initiate a "call" of this
 Query within a Prolog engine. 
- hasNext() - Method in class org.jpl7.Query
- 
- hasSolution() - Method in class org.jpl7.Query
- 
This method will attempt to call this Query's goal within an available
 Prolog engine. 
- hasSolution(Term) - Static method in class org.jpl7.Query
- 
This static method creates a Query (whose goal is the specified Term) and
 calls it at most once, returning true if a solution was found, else
 false. 
- hasSolution(String) - Static method in class org.jpl7.Query
- 
This static method creates a Query from the given Prolog source text and
 calls it at most once, returning true if a solution was found, else
 false. 
- hasSolution(String, Term[]) - Static method in class org.jpl7.Query
- 
If text denotes (in traditional Prolog source syntax) a term containing N
 questionmark (?) symbols and there are N params, each questionmark symbol
 is replaced by its corresponding arg to provide the new Query's goal: the
 resulting Query is called as described above. 
- hostModule - Variable in class org.jpl7.Query
-  
- index - Variable in class org.jpl7.Variable
-  
- init(String[]) - Static method in class org.jpl7.JPL
- 
Initializes the Prolog engine, using the String argument parameters
 passed. 
- init() - Static method in class org.jpl7.JPL
- 
Initialises the Prolog engine using the current default initialisation
 parameters, and returns 'true' (or 'false' if already initialised). 
- initialise() - Static method in class org.jpl7.fli.Prolog
-  
- Int64Holder - Class in org.jpl7.fli
- 
An Int64Holder is merely a Holder class for an int64 value. 
- Int64Holder() - Constructor for class org.jpl7.fli.Int64Holder
-  
- intArrayArrayToList(int[][]) - Static method in class org.jpl7.Term
- 
Converts an array of arrays of int to a corresponding JPL list of lists 
- intArrayArrayToList(int[][]) - Static method in class org.jpl7.Util
- 
- intArrayToList(int[]) - Static method in class org.jpl7.Term
- 
Converts an array of int to a corresponding JPL list 
- intArrayToList(int[]) - Static method in class org.jpl7.Util
- 
- INTEGER - Static variable in class org.jpl7.fli.Prolog
-  
- Integer - Class in org.jpl7
- 
Integer is a specialised Term representing a Prolog integer value; if the value fits, it is held in a long field,
 else as a BigInteger. 
- Integer(long) - Constructor for class org.jpl7.Integer
-  
- Integer(BigInteger) - Constructor for class org.jpl7.Integer
-  
- IntHolder - Class in org.jpl7.fli
- 
An IntHolder is merely a Holder class for an Int value. 
- IntHolder() - Constructor for class org.jpl7.fli.IntHolder
-  
- intValue() - Method in class org.jpl7.Float
- 
Returns the (double) value of this Float, converted to an int 
- intValue() - Method in class org.jpl7.Integer
- 
Returns the value of this Integer as an int if possible, else throws a JPLException 
- intValue() - Method in class org.jpl7.Rational
- 
Returns the value of this Rational as an int if possible, else throws a JPLException 
- intValue() - Method in class org.jpl7.Term
- 
returns the value (as an int) of an Integer or Float 
- is_tag(String) - Static method in class org.jpl7.fli.Prolog
-  
- isAtom() - Method in class org.jpl7.Term
- 
whether this Term is an Atom (of any type) 
- isAtomOfNameType(String, String) - Method in class org.jpl7.Atom
- 
for internal use only 
- isAtomOfNameType(String, String) - Method in class org.jpl7.Term
- 
Tests whether this Term is an Atom with name and type. 
- isBig() - Method in class org.jpl7.Integer
-  
- isBig() - Method in class org.jpl7.Term
- 
Tests whether this Integer's value is too big to represent as a long. 
- isBigInteger() - Method in class org.jpl7.Term
- 
Tests whether this Term is an Integer whose value is too big to represent as a long 
- isCompound() - Method in class org.jpl7.Term
- 
Tests whether this Term is a Compound. 
- isFloat() - Method in class org.jpl7.Term
- 
Tests whether this Term is an org.jpl7.Float. 
- isInteger() - Method in class org.jpl7.Term
- 
Tests whether this Term is an org.jpl7.Integer. 
- isJFalse() - Method in class org.jpl7.Compound
- 
whether this Term is a 'jboolean' structure denoting Java's false, i.e. 
- isJFalse() - Method in class org.jpl7.Term
- 
Tests whether this Term is a 'jfalse' structure, i.e. 
- isJNull() - Method in class org.jpl7.Compound
- 
whether this Term is a 'jnull' structure, i.e. 
- isJNull() - Method in class org.jpl7.Term
- 
Tests whether this Term is a 'jnull' structure, i.e. 
- isJRef() - Method in class org.jpl7.Term
- 
Tests whether this Term is a (non-null, non-String) JPL reference to a Java object, e.g. 
- isJTrue() - Method in class org.jpl7.Compound
- 
whether this Term is a 'jboolean' structure denoting Java's true, i.e. 
- isJTrue() - Method in class org.jpl7.Term
- 
Tests whether this Term is a 'jtrue' structure, i.e. 
- isJVoid() - Method in class org.jpl7.Compound
- 
whether this Term is a 'jvoid' structure, i.e. 
- isJVoid() - Method in class org.jpl7.Term
- 
Tests whether this Term is a 'jvoid' structure, i.e. 
- isList() - Method in class org.jpl7.Term
- 
whether the Term represents a proper list 
- isList(Term) - Static method in class org.jpl7.Term
- 
whether the Term represents a proper list 
- isList(Term) - Static method in class org.jpl7.Util
- 
- isListNil() - Method in class org.jpl7.Atom
- 
whether this Term denotes (syntax-specifically) an empty list 
- isListNil() - Method in class org.jpl7.Term
- 
Tests whether this Term denotes an empty list within the current syntax ("traditional" or "modern"). 
- isListPair() - Method in class org.jpl7.Compound
- 
whether this Term denotes (syntax-specifically) a list cell
 see this does not check the shape of the second argument to check if it is a list
 So a list pair may not be a list itself and hence isList() will return false
 as the second argument many not be a list 
- isListPair() - Method in class org.jpl7.Term
- 
Tests whether this Term is a list pair within the current
 syntax ("traditional" or "modern"). 
- isOpen() - Method in class org.jpl7.Query
- 
Whether the query is open. 
- isSimpleName(String) - Static method in class org.jpl7.JPL
- 
Checks if a string is a simple atom, with no quoting needed 
- isVariable() - Method in class org.jpl7.Term
- 
Tests whether this Term is a Variable. 
- iterator() - Method in class org.jpl7.Query
- 
This method is required by Iterator interface
 a Query is its own Iterator 
- name - Variable in class org.jpl7.Atom
- 
the name of this Atom 
- name() - Method in class org.jpl7.Atom
- 
the name (unquoted) of this Compound 
- name - Variable in class org.jpl7.Compound
- 
The name of (the functor of) this Compound. 
- name() - Method in class org.jpl7.Compound
- 
the name (unquoted) of this Compound 
- name() - Method in class org.jpl7.Term
- 
The name of an Atom, Compound or Variable. 
- name - Variable in class org.jpl7.Variable
- 
the name of this Variable (may be changed as of April 2020) 
- name() - Method in class org.jpl7.Variable
- 
the lexical name of this Variable 
- namevarsToMap(Term) - Static method in class org.jpl7.Util
- 
Converts a (JPL) list of Name=Var pairs (as yielded by atom_to_term/3) to a Map from Prolog variables
 (necessarily in term_t holders) to named JPL Variables 
- new_atom(String) - Static method in class org.jpl7.fli.Prolog
-  
- new_functor(atom_t, int) - Static method in class org.jpl7.fli.Prolog
-  
- new_module(atom_t) - Static method in class org.jpl7.fli.Prolog
-  
- new_term_ref() - Static method in class org.jpl7.fli.Prolog
-  
- new_term_refs(int) - Static method in class org.jpl7.fli.Prolog
-  
- newJRef(Object) - Static method in class org.jpl7.JPL
-  
- next() - Method in class org.jpl7.Query
- 
- next_solution(qid_t) - Static method in class org.jpl7.fli.Prolog
-  
- nextElement() - Method in class org.jpl7.Query
- 
This method implements part of the java.util.Enumeration interface. 
- nextSolution() - Method in class org.jpl7.Query
- 
This method returns a java.util.Map, which represents a binding from the
 names of query variables to terms within the next solution. 
- nSolutions(long) - Method in class org.jpl7.Query
- 
calls the Query's goal to exhaustion or until N solutions are found,
 whichever is sooner, and returns an array containing (as possibly empty
 Maps of variablename-to-term bindings) every found solution (in the order
 in which they were found). 
- nSolutions(Term, long) - Static method in class org.jpl7.Query
- 
This static method creates a Query whose goal is the given Term, calls it
 to exhaustion or until N solutions are found, whichever is sooner, and
 returns an array containing (as possibly empty Maps of
 variablename-to-term bindings) every found solution (in the order in
 which they were found). 
- nSolutions(String, long) - Static method in class org.jpl7.Query
- 
This static method creates a Query from the given Prolog source text
 fragment, calls it to exhaustion or until N solutions are found,
 whichever is sooner, and returns an array containing (as possibly empty
 Maps of variablename-to-term bindings) every found solution (in the order
 in which they were found). 
- nSolutions(String, Term[], long) - Static method in class org.jpl7.Query
- 
If text denotes (in traditional Prolog source syntax) a term containing N
 questionmark (?) symbols and there are N accompanying params, this static
 method replaces each questionmark symbol by its respective param, calls
 the resulting goal to exhaustion or until N solutions are found,
 whichever is sooner, and returns an array containing (as possibly empty
 Maps of variablename-to-term bindings) every found solution (in the order
 in which they were found). 
- numerator - Variable in class org.jpl7.Rational
- 
the numerator and denominator in canonical form:
                gcd(numerator, denominator =  1 (not reducible)
                denominator greater than 1
        rat is a String of the form "NrM" 
- object - Variable in class org.jpl7.JRef
- 
the JRef's value (a non-null, non-String Object) 
- object() - Method in class org.jpl7.JRef
- 
Returns the actual object the JREF stands for 
- object() - Method in class org.jpl7.Term
- 
The Object which this org.jpl7.JRef refers to, iff this Term is a JRef or just JPL.JNULL. 
- object_to_tag(Object) - Static method in class org.jpl7.fli.Prolog
-  
- ObjectHolder - Class in org.jpl7.fli
- 
A ObjectHolder is merely a Holder class for an Object reference (or null). 
- ObjectHolder() - Constructor for class org.jpl7.fli.ObjectHolder
-  
- objectToJRef(Object) - Static method in class org.jpl7.Term
- 
- oneSolution() - Method in class org.jpl7.Query
- 
Returns the first solution, if any, as a (possibly empty) Map of
 variablename-to-term bindings, else null. 
- oneSolution(Term) - Static method in class org.jpl7.Query
- 
This static method creates a Query (whose goal is the specified Term) and
 calls it at most once, returning the first solution, if there is one, as
 a (possibly empty) Map, else null. 
- oneSolution(String) - Static method in class org.jpl7.Query
- 
This static method creates a Query from the given Prolog source text
 fragment, and calls it at most once, returning the first solution, if
 there is one, as a (possibly empty) Map, else null. 
- oneSolution(String, Term[]) - Static method in class org.jpl7.Query
- 
If text denotes (in traditional Prolog source syntax) a term containing N
 questionmark (?) symbols and there are N params, each questionmark symbol
 is replaced by its respective param to provide the goal of this query:
 the resulting goal is then called (at most once) and the first solution,
 if there is one, is returned as a (possibly empty) Map, else null. 
- open() - Method in class org.jpl7.Query
- 
This method returns true if JPL was able to initiate a "call" of this
 Query within the Prolog engine. 
- open_foreign_frame() - Static method in class org.jpl7.fli.Prolog
-  
- open_query(module_t, int, predicate_t, term_t) - Static method in class org.jpl7.fli.Prolog
-  
- org.jpl7 - package org.jpl7
-  
- org.jpl7.fli - package org.jpl7.fli
-  
- PointerHolder - Class in org.jpl7.fli
- 
A PointerHolder is a trivial extension of a LongHolder. 
- PointerHolder() - Constructor for class org.jpl7.fli.PointerHolder
-  
- predicate(String, int, String) - Static method in class org.jpl7.fli.Prolog
-  
- predicate_t - Class in org.jpl7.fli
- 
A predicate_t is a PointerHolder class whose value is a reference to a Prolog
 predicate_t. 
- predicate_t() - Constructor for class org.jpl7.fli.predicate_t
-  
- Prolog - Class in org.jpl7.fli
- 
This class consists only of constants (static finals) and static native
 methods. 
- Prolog() - Constructor for class org.jpl7.fli.Prolog
-  
- PrologException - Exception in org.jpl7
- 
PrologException instances wrap Prolog exceptions thrown (either by a Prolog
 engine or by user code) in the course of finding a solution to a Query. 
- PrologException(Term) - Constructor for exception org.jpl7.PrologException
-  
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.Atom
- 
To put an Atom in a term, we create a sequence of term_t references from the Term.terms_to_term_ts() method, and
 then use the Prolog.cons_functor_v() method to create a Prolog compound term. 
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.Compound
- 
To put a Compound in a term, we create a sequence of term_t references from the Term.terms_to_term_ts() method,
 and then use the Prolog.cons_functor_v() method to create a Prolog compound term. 
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.Dict
- 
To convert an Rational into a Prolog term, we put its value into the term_t. 
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.Float
- 
To convert a JPL Float to a Prolog term, we put its value field into the
 term_t as a float. 
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.Integer
- 
To convert an Integer into a Prolog term, we put its value into the term_t. 
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.JRef
- 
To convert a JRef to a term, we put its Object field (.ref) into the term_t as a <jref>(0x01DF800) blob. 
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.Rational
- 
To convert an Rational into a Prolog term, we put its value into the term_t. 
- put(term_t) - Method in class org.jpl7.Term
-  
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.Term
- 
Cache the reference to the Prolog term_t here. 
- put(Map<String, term_t>, term_t) - Method in class org.jpl7.Variable
- 
To put a Variable, we must check whether a (non-anonymous) variable with
 the same name has already been put in the Term. 
- put_atom_chars(term_t, String) - Static method in class org.jpl7.fli.Prolog
-  
- put_float(term_t, double) - Static method in class org.jpl7.fli.Prolog
-  
- put_integer(term_t, long) - Static method in class org.jpl7.fli.Prolog
-  
- put_integer_big(term_t, String) - Static method in class org.jpl7.fli.Prolog
-  
- put_jref(term_t, Object) - Static method in class org.jpl7.fli.Prolog
-  
- put_nil(term_t) - Static method in class org.jpl7.fli.Prolog
-  
- put_rational(term_t, String) - Static method in class org.jpl7.fli.Prolog
-  
- put_term(term_t, term_t) - Static method in class org.jpl7.fli.Prolog
-  
- put_variable(term_t) - Static method in class org.jpl7.fli.Prolog
-  
- putParams(Term[]) - Method in class org.jpl7.Term
- 
This internal method is public because it needs to be callable via JNI, but it is not part of JPL's public API
 and should not be used by applications. 
- putParams(Term) - Method in class org.jpl7.Term
-  
- putParams1(IntHolder, Term[]) - Method in class org.jpl7.Term
-  
- putParams2(Term[], IntHolder, Term[]) - Static method in class org.jpl7.Term
-  
- putTerm(Object, term_t) - Static method in class org.jpl7.Term
-  
- putTerms(Map<String, term_t>, Term[]) - Static method in class org.jpl7.Term
- 
This static method converts an array of Terms to a *consecutive* sequence of term_t objects. 
- tag - Variable in class org.jpl7.Dict
- 
The tag of the dictionary - an Atom or a Variable 
- tag_to_object(String) - Static method in class org.jpl7.fli.Prolog
-  
- term() - Method in exception org.jpl7.PrologException
-  
- Term - Class in org.jpl7
- 
Term is the abstract base class for Compound, Atom, Variable, Integer and Float, which comprise a Java-oriented
 concrete syntax for Prolog. 
- Term() - Constructor for class org.jpl7.Term
- 
This default constructor enables subclasses to define their own default constructors 
- term_ - Variable in class org.jpl7.Variable
- 
defined between Query.open() and Query.get2() 
- term_t - Class in org.jpl7.fli
- 
A term_t is a simple class which mirrors the term_t type in the Prolog FLI. 
- term_t() - Constructor for class org.jpl7.fli.term_t
-  
- term_type(term_t) - Static method in class org.jpl7.fli.Prolog
-  
- termArrayToList(Term[]) - Static method in class org.jpl7.Term
- 
Converts an array of Terms to a JPL representation of a Prolog list of terms whose members correspond to the
 respective array elements. 
- termArrayToList(Term[]) - Static method in class org.jpl7.Util
- 
- textParamsToTerm(String, Term[]) - Static method in class org.jpl7.Term
- 
Converts a Prolog source text to a corresponding JPL Term (in which each Variable has the appropriate name from
 the source text), replacing successive occurrences of ? in the text by the corresponding element of Term[]
 params. 
- textParamsToTerm(String, Term[]) - Static method in class org.jpl7.Util
- 
Converts a Prolog source text to a corresponding JPL Term (in which each Variable has the appropriate name from
 the source text), replacing successive occurrences of ? in the text by the corresponding element of Term[]
 params. 
- textToTerm(String) - Static method in class org.jpl7.Term
- 
Converts a Prolog source text (as a String) to a corresponding JPL Term
 (in which each Variable has the appropriate name from the source text). 
- textToTerm(String) - Static method in class org.jpl7.Util
- 
- thread_self() - Static method in class org.jpl7.fli.Prolog
-  
- toString() - Method in class org.jpl7.Atom
- 
an Atom's name is quoted if it is not a simple identifier. 
- toString() - Method in class org.jpl7.Compound
- 
a prefix functional representation of a Compound of the form name(arg1,...),
 where 'name' is quoted iff necessary
 (to be valid Prolog source text) and each argument is represented according to its
 toString() method. 
- toString() - Method in class org.jpl7.Dict
- 
a Prolog source text representation of this dictionary's value 
- toString() - Method in class org.jpl7.fli.atom_t
- 
The String representation of an atom_t is just the atom's name. 
- toString(int, term_t) - Static method in class org.jpl7.fli.term_t
- 
This static method converts a term_t, which is assumed to contain a
 reference to a *consecutive* list of term_t references to a String
 representation of a list of terms, in this case, a comma separated list. 
- toString() - Method in class org.jpl7.Float
- 
Returns a Prolog source text representation of this Float 
- toString() - Method in class org.jpl7.Integer
- 
a Prolog source text representation of this Integer's value 
- toString() - Method in class org.jpl7.JRef
- 
Returns a Prolog source text representation of this JRef 
- toString() - Method in class org.jpl7.Query
- 
Returns a crude String representation of a Query. 
- toString() - Method in class org.jpl7.Rational
- 
a Prolog source text representation of this Rational's value 
- toString(Term[]) - Static method in class org.jpl7.Term
- 
Converts a list of Terms to a String. 
- toString(Map<String, Term>) - Static method in class org.jpl7.Util
- 
- toString() - Method in class org.jpl7.Variable
- 
Returns a Prolog source text representation of this Variable 
- toTermArray() - Method in class org.jpl7.Term
- 
- type - Variable in class org.jpl7.Atom
- 
the type of this Atom (e.g. 
- type() - Method in class org.jpl7.Atom
- 
returns the type of this term, as "Prolog.ATOM" 
- type() - Method in class org.jpl7.Compound
- 
the type of this term, as jpl.fli.Prolog.COMPOUND 
- type() - Method in class org.jpl7.Dict
- 
the type of this term, as "Prolog.DICT" 
- type() - Method in class org.jpl7.Float
-  
- type() - Method in class org.jpl7.Integer
- 
the type of this term, as "Prolog.INTEGER" 
- type() - Method in class org.jpl7.JRef
-  
- type() - Method in class org.jpl7.Rational
- 
the type of this term, as "Prolog.RATIONAL" 
- type() - Method in class org.jpl7.Term
- 
returns the type of this term, as one of org.jpl7.fli.Prolog.COMPOUND, .ATOM, .VARIABLE, .INTEGER, .FLOAT etc 
- type() - Method in class org.jpl7.Variable
- 
returns the type of this subclass of Term, i.e. 
- typeName() - Method in class org.jpl7.Atom
- 
returns the name of the type of this term, as "Atom" 
- typeName() - Method in class org.jpl7.Compound
- 
the name of the type of this term, as "Compound" 
- typeName() - Method in class org.jpl7.Dict
- 
the name of the type of this term, as "Rational" 
- typeName() - Method in class org.jpl7.Float
-  
- typeName() - Method in class org.jpl7.Integer
- 
the name of the type of this term, as "Integer" 
- typeName() - Method in class org.jpl7.JRef
-  
- typeName() - Method in class org.jpl7.Rational
- 
the name of the type of this term, as "Rational" 
- typeName() - Method in class org.jpl7.Term
- 
returns the name of the type of this term, as one of "Compound", "Atom", "Variable", "Integer", "Float" or "JRef" 
- typeName() - Method in class org.jpl7.Variable
- 
returns the typeName of this subclass of Term, i.e.