1/*****************************************************************************
    2 * This file is part of the Prolog Development Tool (PDT)
    3 * 
    4 * WWW: http://sewiki.iai.uni-bonn.de/research/pdt/start
    5 * Mail: pdt@lists.iai.uni-bonn.de
    6 * Copyright (C): 2004-2012, CS Dept. III, University of Bonn
    7 * 
    8 * All rights reserved. This program is  made available under the terms
    9 * of the Eclipse Public License v1.0 which accompanies this distribution,
   10 * and is available at http://www.eclipse.org/legal/epl-v10.html
   11 * 
   12 ****************************************************************************/
   13
   14:- multifile(logtalk_library_path/2).   15:- dynamic(logtalk_library_path/2).   16logtalk_library_path(pdt_common_pl_lgt, Library) :-
   17	absolute_file_name(pdt_common_pl('lgt/loader.pl'), FilePath),
   18	file_directory_name(FilePath,Directory),
   19	atom_concat(Directory, '/', Library).
   20
   21load_lgt_adapter :-
   22    (current_predicate(user:logtalk_load/1)
   23    -> logtalk_load([
   24            library(types_loader),
   25            library(metapredicates_loader),
   26            help(loader),
   27		    pdt_common_pl_lgt(utils4entities),
   28			pdt_common_pl_lgt(logtalk_adapter)
   29       ])
   30	;  true
   31	).
   32	
   33:- initialization( load_lgt_adapter ).