1%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
    2%% $Id: extension_procedure.pl,v 1.6 1994/05/17 15:56:04 gerd Exp $
    3%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
    4%%% 
    5%%% This file is part of ProCom.
    6%%% It is distributed under the GNU General Public License.
    7%%% See the file COPYING for details.
    8%%% 
    9%%% (c) Copyright 1994 Gerd Neugebauer
   10%%% 
   11%%% Net: gerd@intellektik.informatik.th-darmstadt.de
   12%%% 
   13%%%****************************************************************************
   14
   15:- module(my_extension_procedure).   16:- compile(library(capri)).   17
   18require_option(equality,[off]).
   19force_option('ProCom::post_link' = ['upp_unify.pl']).
   20force_option(connect_weak_unifyable = off).
   21
   22descriptor
   23	proof(reduction(Pred)),
   24	template(Pred),
   25	template(-Pred,path).
   26
   27descriptor
   28