1/*  LogicMOO User Modules Setup
    2%
    3%
    4% Dec 13, 2035
    5% Douglas Miles
    6
    7*/
    8:- module(logicmoo_mud, [ ]).    9
   10
   11
   12:- if(\+ exists_source(prologmud(mud_loader))).   13:- must((absolute_file_name(library('prologmud/'),Dir,[file_type(directory),access(read)]),
   14   asserta(user:file_search_path(prologmud,Dir)))).   15:- sanity(exists_source(prologmud(mud_loader))).   16:- endif.   17
   18
   19% ==============================================
   20% [Required] Load the Logicmoo User System
   21% ==============================================
   22:- ensure_loaded(library(logicmoo_lib)).   23
   24:- if( \+ exists_source(library(prologmud/mud_startup))).   25:- add_pack_path(packs_sys).   26:- endif.   27
   28
   29:- if( \+ app_argv('--nomud')).   30:- baseKB:ensure_loaded(prologmud(mud_loader)).   31:- endif.   32
   33
   34:- current_prolog_flag(access_level,WAS),!,
   35   set_prolog_flag(access_level,user),
   36   baseKB:ensure_loaded(prologmud(mud_startup)),
   37   set_prolog_flag(access_level,WAS).   38
   39
   40
   41:- fixup_exports.