This module deals with saving and loading application settings such as
preferences and the layout of windows.
- See also
- - library(settings) provides the Prolog equivalent
register_config(:Pred) is det- Register Pred to provide metadata about the configuration
handled in the calling module. Pred is called as
call(Pred,
Path, Attributes)
.
get_config(:Key, -Value) is det- Get configuration for Key as Value.
set_config(:Key, +Value) is det- Set the configuration parameter Key to Value. If the value is
modified, a broadcast message
set_config(Key, Value)
is issued.
config_attributes(+Key, -Attributes)- Fetch the (meta) attributes of the given config key. The special
path `config' returns information on the config database itself.
The path of the key may be partly instantiated.
pce_object_type(+Type)[private]- Succeed if Type denotes an XPCE type
Undocumented predicates
The following predicates are exported, but not or incorrectly documented.
current_config_type(Arg1, Arg2, Arg3)
ensure_loaded_config(Arg1)
config_term_to_object(Arg1, Arg2, Arg3)
config_term_to_object(Arg1, Arg2)
edit_config(Arg1)
save_config(Arg1)
del_config(Arg1, Arg2)
add_config(Arg1, Arg2)
register_config_type(Arg1, Arg2)
load_config(Arg1)