- author
- - Kaarel Kaljurand
- - Tobias Kuhn
- version
- - 2009-05-13
Usage with multiple results returned (i.e. multi-mode):
get_ape_results([text='Every man waits.', cparaphrase1=on], ContentType, Content).
get_ape_results([text='Every man waits.', cparaphrase=on, cparaphrase1=on], ContentType, Content).
get_ape_results([text='A man waits.', cinput=on, cdrs=on, cdrspp=on, cparaphrase=on, cparaphrase1=on, cparaphrase2=on, ctokens=on, csyntax=on, csyntaxpp=on, cfol=on], ContentType, Content).
Usage with a single result returned (i.e. solo-mode):
get_ape_results([text='A man sees a dog.', solo=drs], ContentType, Content).
get_ape_results([text='Every man owns a dog.', solo=owlrdf], ContentType, Content).
get_ape_results([text='Peeter likes Mary.', solo=owlfss], ContentType, Content).
- To be done
- - : provide all outputs
(1) as serialized Prolog terms,
(2) as pretty-printed terms,
(3) as XML, JSON, HTML, etc.
- get_ape_results_timelimit(+Input:list, -Content:atom, +TimeLimit) is det
- get_ape_results_timelimit(+Input:list, -ContentType:atom, -Content:atom, +TimeLimit) is det
- There is call_with_time_limit(+Time, :Goal) defined in library(time),
part of clib package. On timeout this throws the exception time_limit_exceeded.
But we catch other exceptions as well...
- Arguments:
-
Input | - is a list of input parameters of the form Key=Value |
ContentType | - is one of {text/plain, text/xml} |
Content | - is the returned result |
TimeLimit | - the timelimit in seconds |
- get_ape_results(+Input:list, -Content:atom) is det
- get_ape_results(+Input:list, -ContentType:atom, -Content:atom) is det
-
- Arguments:
-
Input | - is a list of input parameters of the form Key=Value |
ContentType | - is one of {text/plain, text/xml} |
Content | - is the returned XML |
Undocumented predicates
The following predicates are exported, but not or incorrectly documented.
- get_ape_results_timelimit(Arg1, Arg2, Arg3, Arg4)
- get_ape_results(Arg1, Arg2, Arg3)