
prolog_pack.pl -- A package manager for PrologThe library(prolog_pack) provides the SWI-Prolog package manager. This library lets you inspect installed packages, install packages, remove packages, etc. It is complemented by the built-in attach_packs/0 that makes installed packages available as libaries.
pack_list_installed is det
pack_info(+Pack)
pack_search(+Query) is det
pack_list(+Query) is det
Hint: ?- pack_list(''). lists all packages.
The predicates pack_list/1 and pack_search/1 are synonyms. Both contact the package server at http://www.swi-prolog.org to find available packages.
pack_install(+Spec:atom) is detfile:// URL.After resolving the type of package, pack_install/2 is used to do the actual installation.
pack_install(+Name, +Options) is dettrue (default false), suppress informational progress
messages.true (default false), upgrade package if it is already
installed.true (default false unless URL ends with =.git=),
assume the URL is a GIT repository.
Non-interactive installation can be established using the option
interactive(false). It is adviced to install from a particular
trusted URL instead of the plain pack name for unattented
operation.
pack_url_file(+URL, -File) is det
pack_rebuild(+Pack) is det
pack_rebuild is det
environment(-Name, -Value) is nondet[multifile]
prolog_pack:environment('USER', User) :-
getenv('USER', User).
pack_upgrade(+Pack) is semidet
pack_remove(+Name) is det
pack_property(?Pack, ?Property) is nondetREADME file (if present)TODO file (if present)
pack_search(+Query) is det
pack_list(+Query) is det
Hint: ?- pack_list(''). lists all packages.
The predicates pack_list/1 and pack_search/1 are synonyms. Both contact the package server at http://www.swi-prolog.org to find available packages.