Skip to content

Commit

Permalink
applied utils/replaceAllHeaders.sh
Browse files Browse the repository at this point in the history
- all $Header$ tokens in doc comments replaced with corresponding filename
  • Loading branch information
Jens Elkner committed Mar 25, 2016
1 parent 6b19c82 commit e9458b1
Show file tree
Hide file tree
Showing 840 changed files with 840 additions and 840 deletions.
2 changes: 1 addition & 1 deletion ATC/ATCTest.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./ATC/ATCTest.hs
Copyright : (c) C. Maeder, DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion ATC/ATCTest2.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./ATC/ATCTest2.hs
Copyright : (c) C. Maeder, DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion ATC/Grothendieck.der.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE UndecidableInstances, FlexibleInstances, OverlappingInstances #-}
{- |
Module : $Header$
Module : ./ATC/Grothendieck.der.hs
Description : manually created ShATermConvertible instances
Copyright : (c) Felix Reckers, C. Maeder, Uni Bremen 2002-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion ATC/Sml_cats.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./ATC/Sml_cats.hs
Description : conversions to and from old SML aterm format
Copyright : (c) Klaus Luettich and Uni Bremen 2002-2004
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion Adl/As.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE DeriveDataTypeable #-}
{- |
Module : $Header$
Module : ./Adl/As.hs
Description : abstract ADL syntax
Copyright : (c) Stef Joosten, Christian Maeder DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion Adl/Logic_Adl.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE MultiParamTypeClasses, TypeSynonymInstances, FlexibleInstances #-}
{- |
Module : $Header$
Module : ./Adl/Logic_Adl.hs
Description : the Logic instance for ADL
Copyright : (c) Stef Joosten, Christian Maeder DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion Adl/Parse.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./Adl/Parse.hs
Description : ADL syntax parser
Copyright : (c) Stef Joosten, Christian Maeder DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion Adl/Print.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./Adl/Print.hs
Description : pretty printing ADL syntax
Copyright : (c) Stef Joosten, Christian Maeder DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion Adl/Sign.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE DeriveDataTypeable #-}
{- |
Module : $Header$
Module : ./Adl/Sign.hs
Description : ADL signature and sentences
Copyright : (c) Stef Joosten, Christian Maeder DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion Adl/StatAna.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./Adl/StatAna.hs
Description : static ADL analysis
Copyright : (c) Stef Joosten, Christian Maeder DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion Adl/adl.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE CPP #-}
{- |
Module : $Header$
Module : ./Adl/adl.hs
Description : ADL syntax parser
Copyright : (c) Stef Joosten, Christian Maeder DFKI GmbH 2010
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/AS_Basic_CASL.der.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE DeriveDataTypeable #-}
{- |
Module : $Header$
Module : ./CASL/AS_Basic_CASL.der.hs
Description : Abstract syntax of CASL basic specifications
Copyright : (c) Klaus Luettich, Christian Maeder, Uni Bremen 2002-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/AlphaConvert.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/AlphaConvert.hs
Description : alpha-conversion (renaming of bound variables) for CASL formulas
Copyright : (c) Christian Maeder, Uni Bremen 2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Amalgamability.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE FlexibleInstances #-}
{- |
Module : $Header$
Module : ./CASL/Amalgamability.hs
Description : Amalgamability analysis for CASL.
Copyright : (c) Maciek Makowski, Warsaw University 2004-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CCC/FreeTypes.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CCC/FreeTypes.hs
Description : consistency checking of free types
Copyright : (c) Mingyi Liu and Till Mossakowski and Uni Bremen 2004-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CCC/OnePoint.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{- |
Module : $Header$
Module : ./CASL/CCC/OnePoint.hs
Description : Check for truth in one-point model
Copyright : (c) Mingyi Liu and Till Mossakowski and Uni Bremen 2004
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CCC/TermFormula.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CCC/TermFormula.hs
Description : auxiliary functions on terms and formulas
Copyright : (c) Mingyi Liu, Till Mossakowski, Uni Bremen 2004-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CCC/TerminationProof.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CCC/TerminationProof.hs
Description : termination proofs for equation systems, using AProVE
Copyright : (c) Mingyi Liu and Till Mossakowski and Uni Bremen 2004-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/ColimSign.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE FlexibleInstances, FlexibleContexts #-}
{- |
Module : $Header$
Module : ./CASL/ColimSign.hs
Description : CASL signatures colimits
Copyright : (c) Mihai Codescu, and Uni Bremen 2002-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/CompositionTable.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/CompositionTable.hs
Description : composition tables of qualitative calculi
Copyright : (c) Uni Bremen 2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/ComputeTable.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/ComputeTable.hs
Description : Compute the composition table of a relational algebra
Copyright : (c) Till Mossakowski, Uni Bremen 2002-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/Keywords.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/Keywords.hs
Description : keywords for composition tables
Copyright : (c) Christian Maeder DFKI 2012
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/ModelChecker.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE CPP #-}
{- |
Module : $Header$
Module : ./CASL/CompositionTable/ModelChecker.hs
Description : checks validity of models regarding a composition table
Copyright : (c) Uni Bremen 2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/ModelFormula.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/ModelFormula.hs
Description : intermediate calculus formula
Copyright : (c) DFKI Bremen 2012
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/ModelTable.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/ModelTable.hs
Description : intermediate calculus table
Copyright : (c) Uni Bremen 2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/ParseSparQ.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/ParseSparQ.hs
Description : parsing SparQ CompositionTables
Copyright : (c) Christian Maeder and Uni Bremen 2002-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/ParseTable2.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/ParseTable2.hs
Description : parsing SparQ CompositionTables
Copyright : (c) Christian Maeder and Uni Bremen 2002-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/Pretty2.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/Pretty2.hs
Description : pretty output for composition tables
Copyright : (c) Christian Maeder DFKI 2012
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/CompositionTable/ToXml.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/CompositionTable/ToXml.hs
Description : XML output for composition tables of qualitative calculi
Copyright : (c) Uni Bremen 2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Cycle.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Cycle.hs
Description : removing sort cycles
Copyright : (c) Christian Maeder, DFKI GmbH 2013
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Disambiguate.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Disambiguate.hs
Description : disambiguate all names
Copyright : (c) Christian Maeder, DFKI GmbH 2008
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Fold.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Fold.hs
Description : folding functions for CASL terms and formulas
Copyright : (c) Christian Maeder, Uni Bremen 2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Formula.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Formula.hs
Description : Parser for CASL terms and formulae
Copyright : (c) Christian Maeder, Uni Bremen 2002-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Freeness.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Freeness.hs
Description : Computation of the constraints needed for free definition links.
Copyright : (c) Adrian Riesco, Facultad de Informatica UCM 2009
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Induction.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Induction.hs
Description : Derive induction schemes from sort generation constraints
Copyright : (c) Till Mossakowski, Rainer Grabbe and Uni Bremen 2002-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Inject.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Inject.hs
Description : Replace Sorted_term(s) with explicit injection functions.
Copyright : (c) Christian Maeder, Uni Bremen 2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Kif.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Kif.hs
Description : Parsing lists of lists with SUMO .kif files
Copyright : (c) T.Mossakowski, C.Maeder and Uni Bremen 2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Kif2CASL.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Kif2CASL.hs
Description : Parser for SUMO (suggested upper merged ontology) .kif files
Copyright : (c) T.Mossakowski, C.Maeder and Uni Bremen 2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Logic_CASL.hs
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
{-# LANGUAGE CPP, MultiParamTypeClasses, TypeSynonymInstances
, FlexibleInstances #-}
{- |
Module : $Header$
Module : ./CASL/Logic_CASL.hs
Description : Instance of class Logic for the CASL logic
Copyright : (c) Klaus Luettich, Uni Bremen 2002-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/MapSentence.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/MapSentence.hs
Description : rename symbols of sentences according to a signature morphisms
Copyright : (c) Christian Maeder, Till Mossakowski and Uni Bremen 2002-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/MixfixParser.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/MixfixParser.hs
Description : Mixfix analysis of terms
Copyright : Christian Maeder and Uni Bremen 2002-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Monoton.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Monoton.hs
Description : monotonicities of the overload relation
Copyright : (c) C. Maeder DFKI Uni Bremen 2002-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Morphism.hs
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
{-# LANGUAGE MultiParamTypeClasses, FunctionalDependencies
, FlexibleInstances, DeriveDataTypeable #-}
{- |
Module : $Header$
Module : ./CASL/Morphism.hs
Description : Symbols and signature morphisms for the CASL logic
Copyright : (c) Christian Maeder, Till Mossakowski and Uni Bremen 2002-2004
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/OMDoc.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/OMDoc.hs
Description : CASL specific OMDoc constants
Copyright : (c) Ewaryst Schulz, DFKI Bremen 2009
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/OMDocExport.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE FlexibleInstances, TypeSynonymInstances #-}
{- |
Module : $Header$
Module : ./CASL/OMDocExport.hs
Description : CASL-to-OMDoc conversion
Copyright : (c) Ewaryst Schulz, DFKI Bremen 2009
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/OMDocImport.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/OMDocImport.hs
Description : OMDoc-to-CASL conversion
Copyright : (c) Ewaryst Schulz, DFKI Bremen 2009
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/OpItem.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/OpItem.hs
Description : Parser for OP-ITEMs (operation declarations and definitions)
Copyright : (c) Christian Maeder, Uni Bremen 2002-2004
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Overload.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Overload.hs
Description : Overload resolution
Copyright : (c) Martin Kuehl, T. Mossakowski, C. Maeder, 2004-2007
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Parse_AS_Basic.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Parse_AS_Basic.hs
Description : Parsing CASL's SIG-ITEMS, BASIC-ITEMS and BASIC-SPEC
Copyright : (c) Christian Maeder, Uni Bremen 2002-2004
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Project.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Project.hs
Description : replace casts with explicit projection functions
Copyright : (c) Christian Maeder, Uni Bremen 2005-2006
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Qualify.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Qualify.hs
Description : Code out overloading and qualify all names
Copyright : (c) Christian Maeder, DFKI GmbH 2008
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/Quantification.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/Quantification.hs
Description : Free variables; getting rid of superfluous quantifications
Copyright : (c) Till Mossakowski and Uni Bremen 2002-2005
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/QuickCheck.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE FlexibleInstances #-}
{- |
Module : $Header$
Module : ./CASL/QuickCheck.hs
Description : QuickCheck model checker for CASL.CFOL
Copyright : (c) Till Mossakowski, Uni Bremen 2007
License : GPLv2 or higher, see LICENSE.txt
Expand Down
2 changes: 1 addition & 1 deletion CASL/RunMixfixParser.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{- |
Module : $Header$
Module : ./CASL/RunMixfixParser.hs
Description : make mixfix analysis checkable by RunParsers
Copyright : (c) Klaus Luettich, Christian Maeder and Uni Bremen 2002-2003
License : GPLv2 or higher, see LICENSE.txt
Expand Down
Loading

0 comments on commit e9458b1

Please sign in to comment.