Skip to content

Commit

Permalink
Strip remaining copyright from headers
Browse files Browse the repository at this point in the history
See AUTHORS and git history if interested. The reasoning is that these
are grossly out of date and incomplete.
  • Loading branch information
Fuuzetsu committed Oct 12, 2014
1 parent c550ebd commit d17782d
Show file tree
Hide file tree
Showing 26 changed files with 3 additions and 61 deletions.
4 changes: 0 additions & 4 deletions yi/src/executable/Main.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,3 @@
-- Copyright (C) 2008 JP Bernardy
-- Copyright (C) 2004 Don Stewart - http://www.cse.unsw.edu.au/~dons

-- | "Real" Frontend to the static binary.

module Main (main) where
Expand All @@ -10,4 +7,3 @@ import Yi.Config.Default (defaultConfig)

main :: IO ()
main = yiDriver defaultConfig

4 changes: 0 additions & 4 deletions yi/src/library/Parser/Incremental.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,3 @@
-- Copyright (c) JP Bernardy 2008
{-# LANGUAGE GADTs, RankNTypes, ScopedTypeVariables, TypeOperators #-}

-- TODO:
Expand Down Expand Up @@ -365,6 +364,3 @@ onRight f (Zip errs x y) = Zip errs x (f y)


type Process token result = Zip token (result :< ())



1 change: 0 additions & 1 deletion yi/src/library/Yi/Buffer.hs
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,6 @@
-- |
-- Module : Yi.Buffer
-- License : GPL-2
-- Copyright : Jean-Philippe Bernardy 2008
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
-- Portability : portable
Expand Down
2 changes: 0 additions & 2 deletions yi/src/library/Yi/Buffer/Implementation.hs
Original file line number Diff line number Diff line change
Expand Up @@ -12,8 +12,6 @@

-- |
-- Module : Yi.Buffer.Implementation
-- Copyright : (c) Don Stewart 2004, 2005
-- Jean-Philippe Bernardy 2007, 2008
-- License : GPL-2
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
Expand Down
3 changes: 0 additions & 3 deletions yi/src/library/Yi/Buffer/Normal.hs
Original file line number Diff line number Diff line change
@@ -1,7 +1,4 @@
{-# LANGUAGE TemplateHaskell, CPP, StandaloneDeriving #-}
--
-- Copyright (C) 2008 JP Bernardy
--

-- | A normalized API to many buffer operations.

Expand Down
4 changes: 0 additions & 4 deletions yi/src/library/Yi/Buffer/Undo.hs
Original file line number Diff line number Diff line change
@@ -1,9 +1,5 @@
{-# LANGUAGE TemplateHaskell, CPP, StandaloneDeriving, DeriveGeneric #-}

-- Copyright (c) 2004 Don Stewart - http://www.cse.unsw.edu.au/~dons
-- Copyright (c) 2008 JP Bernardy

--
-- | An implementation of restricted, linear undo, as described in:
--
-- > T. Berlage, "A selective undo mechanism for graphical user interfaces
Expand Down
1 change: 0 additions & 1 deletion yi/src/library/Yi/Config/Default.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,5 @@
{-# LANGUAGE CPP #-}
{-# LANGUAGE OverloadedStrings #-}
-- Copyright (c) Jean-Philippe Bernardy 2006,2007,2008.

module Yi.Config.Default ( defaultConfig, availableFrontends, defaultEmacsConfig
, defaultVimConfig, defaultCuaConfig, toVimStyleConfig
Expand Down
2 changes: 0 additions & 2 deletions yi/src/library/Yi/Config/Misc.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,3 @@
-- Copyright (C) 2010 Jeremy Wall
module Yi.Config.Misc where

data ScrollStyle = SnapToCenter | SingleLine

3 changes: 0 additions & 3 deletions yi/src/library/Yi/Core.hs
Original file line number Diff line number Diff line change
Expand Up @@ -8,9 +8,6 @@
-- |
-- Module : Yi.Core
-- License : GPL-2
-- Copyright : Tuomo Valkonen 2004
-- Don Stewart 2004-2005
-- Jean-Philippe Bernardy 2007-2008
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
-- Portability : portable
Expand Down
2 changes: 0 additions & 2 deletions yi/src/library/Yi/IncrementalParse.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,3 @@
-- Copyright (c) JP Bernardy 2008
{-# LANGUAGE ScopedTypeVariables #-}

module Yi.IncrementalParse (recoverWith, symbol, eof, lookNext, testNext,
Expand Down Expand Up @@ -28,4 +27,3 @@ scanner parser input = Scanner
updateState0 curState toks@((st,tok):rest) = ((st, curState), result) : updateState0 nextState rest
where nextState = evalL $ pushSyms [tok] curState
result = fst $ evalR $ pushEof $ pushSyms (fmap snd toks) curState

1 change: 0 additions & 1 deletion yi/src/library/Yi/Interact.hs
Original file line number Diff line number Diff line change
Expand Up @@ -8,7 +8,6 @@

{-|
Module : Yi.Interact
Copyright : (c) Jean-Philippe Bernardy 2007-2008
License : GPL-2
Maintainer : yi-devel@googlegroups.com
Stability : experimental
Expand Down
1 change: 0 additions & 1 deletion yi/src/library/Yi/Keymap.hs
Original file line number Diff line number Diff line change
Expand Up @@ -14,7 +14,6 @@
-- |
-- Module : Yi.Keymap
-- License : GPL-2
-- Copyright : Jean-Philippe Bernardy 2007-2008
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
-- Portability : portable
Expand Down
6 changes: 0 additions & 6 deletions yi/src/library/Yi/Keymap/Completion.hs
Original file line number Diff line number Diff line change
@@ -1,8 +1,3 @@
--
-- Copyright (c) B.Zapf July 2005
--
--

-- | This is a little helper for completion interfaces.

module Yi.Keymap.Completion (
Expand Down Expand Up @@ -62,4 +57,3 @@ complete (CT level) (a:ta) = first ((:) a) $


--alternatives :: CompletionTree a->[[a]]

1 change: 0 additions & 1 deletion yi/src/library/Yi/Keymap/Emacs/Utils.hs
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,6 @@

-- |
-- Module : Yi.Keymap.Emacs.Utils
-- Copyright : (c) Jean-Philippe Bernardy 2005, 2007-2008
-- License : GPL-2
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
Expand Down
3 changes: 0 additions & 3 deletions yi/src/library/Yi/Main.hs
Original file line number Diff line number Diff line change
@@ -1,7 +1,4 @@
{-# LANGUAGE CPP #-}
-- Copyright (c) Tuomo Valkonen 2004.
-- Copyright (c) Don Stewart 2004-5.
-- Copyright (c) Jean-Philippe Bernardy 2006,2007.

-- | This is the main module of Yi, called with configuration from the user.
-- Here we mainly process command line arguments.
Expand Down
1 change: 0 additions & 1 deletion yi/src/library/Yi/Mode/Abella.hs
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,6 @@

-- |
-- Module : Yi.Mode.Abella
-- Copyright : (c) Nicolas Pouillard 2009
-- License : GPL-2
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
Expand Down
1 change: 0 additions & 1 deletion yi/src/library/Yi/Mode/Compilation.hs
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,6 @@

-- |
-- Module : Yi.Mode.Compilation
-- Copyright : (c) Jean-Philippe Bernardy 2008
-- License : GPL-2
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
Expand Down
1 change: 0 additions & 1 deletion yi/src/library/Yi/Mode/Haskell.hs
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,6 @@

-- |
-- Module : Yi.Mode.Haskell
-- Copyright : (c) Jean-Philippe Bernardy 2008
-- License : GPL-2
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
Expand Down
3 changes: 1 addition & 2 deletions yi/src/library/Yi/PersistentState.hs
Original file line number Diff line number Diff line change
Expand Up @@ -8,8 +8,7 @@
CPP,
StandaloneDeriving,
DeriveGeneric #-}
-- Copyright '2012 by Michal J. Gajda
--

-- | This module implements persistence across different Yi runs.
-- It includes minibuffer command history, marks etc.
-- Warning: Current version will _not_ check whether two or more instances
Expand Down
1 change: 0 additions & 1 deletion yi/src/library/Yi/Process.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,4 @@
{-# LANGUAGE CPP, ScopedTypeVariables #-}
-- Copyright (c) 2005 Don Stewart - http://www.cse.unsw.edu.au/~dons
module Yi.Process (runProgCommand, runShellCommand, shellFileName,
createSubprocess, readAvailable, SubprocessInfo(..), SubprocessId) where

Expand Down
2 changes: 0 additions & 2 deletions yi/src/library/Yi/Syntax/Driver.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,5 @@
{-# LANGUAGE ScopedTypeVariables, ExistentialQuantification, MultiParamTypeClasses #-}
{-# OPTIONS_GHC -fno-warn-name-shadowing #-}
-- Copyright (C) JP Bernardy 2009

-- | This module defines implementations of syntax-awareness drivers.

Expand Down Expand Up @@ -58,4 +57,3 @@ unzipFM l = (M.fromList mu, M.fromList mv)

zipWithFM :: Ord k => (u -> v -> w) -> v -> Map k u -> Map k v -> [(k,w)]
zipWithFM f v0 mu mv = [ (k,f u (M.findWithDefault v0 k mv) ) | (k,u) <- M.assocs mu]

1 change: 0 additions & 1 deletion yi/src/library/Yi/Syntax/Latex.hs
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,6 @@

-- |
-- Module : Yi.Syntax.Latex
-- Copyright : (c) JP Bernardy 2008
-- License : GPL-2
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
Expand Down
1 change: 0 additions & 1 deletion yi/src/library/Yi/UI/Pango/Control.hs
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,6 @@

-- |
-- Module : Yi.UI.Pango.Control
-- Copyright : 2007-2009 Jean-Philippe Bernardy, Hamish Mackenzie
-- License : GPL

module Yi.UI.Pango.Control (
Expand Down
8 changes: 1 addition & 7 deletions yi/src/library/Yi/UI/Pango/Gnome.hs
Original file line number Diff line number Diff line change
@@ -1,9 +1,4 @@
--
-- Copyright (c) Colin McQuillan 2009
--
-- Gnome integration
--

-- | Gnome integration
module Yi.UI.Pango.Gnome(watchSystemFont) where

import Control.Monad
Expand All @@ -24,4 +19,3 @@ watch gconf key cb = do
cb =<< gconfGet gconf key
gconfNotifyAdd gconf key $ \key' val -> when (key == key') (cb val)
return ()

6 changes: 1 addition & 5 deletions yi/src/library/Yi/UI/Pango/Utils.hs
Original file line number Diff line number Diff line change
@@ -1,10 +1,6 @@
{-# LANGUAGE OverloadedStrings #-}
--
-- Copyright (c) Krasimir Angelov 2008.
--
-- Random GTK utils
--

-- | Random GTK utils
module Yi.UI.Pango.Utils where

import Control.Exception (catch, throw)
Expand Down
1 change: 0 additions & 1 deletion yi/src/library/Yi/Window.hs
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,6 @@

-- |
-- Module : Yi.Window
-- Copyright : (c) Jean-Philippe Bernardy 2008
-- License : GPL-2
-- Maintainer : yi-devel@googlegroups.com
-- Stability : experimental
Expand Down

0 comments on commit d17782d

Please sign in to comment.