1/*
    2% ===================================================================
    3% File 'mpred_db_preds.pl'
    4% Purpose: Emulation of OpenCyc for SWI-Prolog
    5% Maintainer: Douglas Miles
    6% Contact: $Author: dmiles $@users.sourceforge.net ;
    7% Version: 'interface.pl' 1.0.0
    8% Revision:  $Revision: 1.9 $
    9% Revised At:   $Date: 2002/06/27 14:13:20 $
   10% ===================================================================
   11% File used as storage place for all predicates which change as
   12% the world is run.
   13%
   14%
   15% Dec 13, 2035
   16% Douglas Miles
   17*/
   18% File: /opt/PrologMUD/pack/logicmoo_base/prolog/logicmoo/mpred/mpred_props.pl
   19%:- if(( ( \+ ((current_prolog_flag(logicmoo_include,Call),Call))) )).
   20:- module(mpred_props,
   21          [ 
   22
   23          assert_arity/2,
   24          bad_arity/2,
   25          ensure_arity/2,
   26          functor_check_univ/3,
   27          get_arity/3,
   28
   29
   30            mpred_prop_file_begin/0
   31          ]).   32
   33%:- include('mpred_header.pi').
   34
   35:- reexport(library(xlisting)).   36mpred_prop_file_begin.
   37
   38:- fixup_exports.