View source with raw comments or as raw
   1:- module(conf_store, []).
   2:- use_module(library(settings)).
   3
   4/** <module> Configure persistent storage
   5
   6Enable persistent storage of RDF graphs using the given directory.
   7
   8@see library(semweb/rdf_persistency)
   9*/
  10
  11:- set_setting_default(cliopatria:persistent_store, 'RDF-store').
  12:- set_setting_default(cliopatria:pre_index_tokens, true).
  13:- set_setting_default(cliopatria:pre_index_stems, false).