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
   15:- module(pdt_editor_edit_hook,[
   16]).   17
   18:- use_module(library(edit)).   19:- use_module(library(lists)).   20
   21:- multifile(prolog_edit:edit_source/1).   22
   23prolog_edit:edit_source(Location) :-
   24    member(file(File), Location),
   25    (	member(line(Line), Location)
   26    ->	true
   27    ;	Line = 1
   28    ),
   29    format(atom(A), '~w ~w', [File, Line]),
   30    catch(process_observe:process_notify(pdt_edit_hook,A),_,true)