-- --------------------------------------------------------------------------
--  $Revision: 264 $ $Date: 2007-04-13 18:24:56 +0200 (Fri, 13 Apr 2007) $
-- --------------------------------------------------------------------------

-- |
--
-- Module      :  PureFP
-- Copyright   :  Peter Ljunglof 2002
-- License     :  GPL
--
-- Maintainer  :  otakar.smrz mff.cuni.cz
-- Stability   :  provisional
-- Portability :  portable
--
-- This library is an edited excerpt from the /Functional Parsing/ library
-- developed by Peter Ljunglöf in his licenciate thesis /Pure Functional
-- Parsing – an advanced tutorial/, Göteborg University and
-- Chalmers University of Technology, April 2002:
--
-- <http://www.ling.gu.se/~peb/pubs/p02-lic-thesis.pdf>
--
-- <http://www.ling.gu.se/~peb/software.html>
--
-- <http://www.ling.gu.se/~peb/software/functional-parsing/>
--
--
--   Copyright (C) 2002  Peter Ljunglof  (C) 2005-2007  Otakar Smrz
--
--   This program is free software; you can redistribute it and\/or modify
--   it under the terms of the GNU General Public License as published by
--   the Free Software Foundation; either version 2 of the License, or
--   (at your option) any later version.
--
--   This program is distributed in the hope that it will be useful,
--   but WITHOUT ANY WARRANTY; without even the implied warranty of
--   MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
--   GNU General Public License for more details.
--
--   You should have received a copy of the GNU General Public License along
--   with this program; if not, write to the Free Software Foundation, Inc.,
--   51 Franklin Street, Fifth Floor, Boston, MA 02110-1301 USA.
--
--
-- "PureFP.OrdMap" "PureFP.OrdSet" "PureFP.Parsers"


module PureFP where


import Version

version = revised "$Revision: 264 $"