CurryInfo: prolog-3.0.0 / Language.Prolog.Show.showPlGoal

definition:
showPlGoal :: PlGoal -> String
showPlGoal (PlLit pred args)
  | pred == "="
  = showPlTerm (args!!0) ++ "=" ++ showPlTerm (args!!1)
  | pred == "!" && null args
  = "!"
  | otherwise
  = showPlTerm (PlStruct pred args)
showPlGoal (PlNeg goal) =
  "\\+" ++ showSimpleGoals goal
showPlGoal (PlCond cond tgoal fgoal) =
  "(" ++ showSimpleGoals cond ++ " -> " ++ showPlGoals tgoal ++ " ; " ++
  showPlGoals fgoal ++ ")"
demand:
argument 1
deterministic:
deterministic operation
documentation:
--- Shows a Prolog goal in standard Prolog syntax.
failfree:
<FAILING>
indeterministic:
referentially transparent operation
infix:
no fixity defined
iotype:
{({PlLit}) |-> _ || ({PlNeg}) |-> _ || ({PlCond}) |-> _}
name:
showPlGoal
precedence:
no precedence defined
result-values:
_
signature:
Language.Prolog.Types.PlGoal -> String
solution-complete:
operation might suspend on free variables
terminating:
possibly non-terminating
totally-defined:
possibly non-reducible on same data term