
pr_rules.pl -- Output formatting and printing.Predicates related to formatting and printing output. This includes predicates that may be used for warning and error output.
format_term_list(+ListIn:compound, -ListOut:compound) is det[private]
format_predicate2(+EntryIn:compound, -EntryOut:compound) is det[private]
format_predicate3(+ArgsIn:list, -ArgsOut:list) is det[private]
format_predicate4(+ArgsIn:list, -ArgsOut:list) is det[private]
strip_prefixes(+FunctorIn:atom, -FunctorOut:atom) is det[private]
generate_pr_rules(:Sources, +Options)
process_pr_pred(+Spec, -Atom, -Children, -Condition, -Human) is det#pred Spec :: Template. directive.
insert_var(+TermIn, -Term, +VarName, +Var) is det[private]
atom_cond(+Spec, -Atom, -Children, -Condition) is det[private]AtomSpec-Children, where
Children is one of
-, e.g. [p(X)|-], all non-matched
children are discarded.-. All children are discarded.*. This is the default of there are no children
and causes the node to be processed normally.
Each AtomSpec is either a plain Atom, one wrapped, -(Atom)
not(Atom) or not(-(Atom)). A condition may be added to an Atom
as a conjunction, e.g., this denotes the atom p(X), but only if X
is an integer.
:- pred (p(X),integer(X)) :: "bla bla {{X}}".
assert_pr_rules(+Rules:list, +Module) is det[private]
check_existence(+Options)[private]
clean_pr_program(+Module) is det