Repository : ssh://darcs.haskell.org//srv/darcs/packages/bytestring

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/2e61f651f427dff7b5a858970c5fa65acaa8903e

>---------------------------------------------------------------

commit 2e61f651f427dff7b5a858970c5fa65acaa8903e
Author: Duncan Coutts <[email protected]>
Date:   Sun Nov 6 00:16:27 2011 +0000

    Remove unused fusion module

>---------------------------------------------------------------

 Data/ByteString.hs        |    4 ----
 Data/ByteString/Fusion.hs |   24 ------------------------
 bytestring.cabal          |    1 -
 tests/Properties.hs       |    1 -
 tests/QuickCheckUtils.hs  |    1 -
 5 files changed, 0 insertions(+), 31 deletions(-)

diff --git a/Data/ByteString.hs b/Data/ByteString.hs
index 776c9c1..ba7eef4 100644
--- a/Data/ByteString.hs
+++ b/Data/ByteString.hs
@@ -16,10 +16,6 @@
 --               (c) Bjorn Bringert 2006
 --               (c) Don Stewart 2005-2008
 --
---               Array fusion code:
---               (c) 2001,2002 Manuel M T Chakravarty & Gabriele Keller
---               (c) 2006      Manuel M T Chakravarty & Roman Leshchinskiy

>---------------------------------------------------------------

 -- License     : BSD-style
 --
 -- Maintainer  : [email protected]
diff --git a/Data/ByteString/Fusion.hs b/Data/ByteString/Fusion.hs
deleted file mode 100644
index bf102f3..0000000
--- a/Data/ByteString/Fusion.hs
+++ /dev/null
@@ -1,24 +0,0 @@
-{-# OPTIONS_HADDOCK hide #-}
-#if __GLASGOW_HASKELL__ >= 701
-{-# LANGUAGE Safe #-}
-#endif
--- |
--- Module      : Data.ByteString.Fusion
--- License     : BSD-style
--- Maintainer  : [email protected]
--- Stability   : experimental
--- Portability : portable

>---------------------------------------------------------------

--- Stream fusion for ByteStrings.

>---------------------------------------------------------------

--- See the paper /Stream Fusion: From Lists to Streams to Nothing at All/,
--- Coutts, Leshchinskiy and Stewart, 2007.  

>---------------------------------------------------------------

-
-module Data.ByteString.Fusion (
-
-    -- A place holder for Stream Fusion
-
-  ) where
-
-
diff --git a/bytestring.cabal b/bytestring.cabal
index fe625fb..f607427 100644
--- a/bytestring.cabal
+++ b/bytestring.cabal
@@ -46,7 +46,6 @@ library
                      Data.ByteString.Lazy
                      Data.ByteString.Lazy.Char8
                      Data.ByteString.Lazy.Internal
-                     Data.ByteString.Fusion
 
   extensions:        CPP, ForeignFunctionInterface
 
diff --git a/tests/Properties.hs b/tests/Properties.hs
index 6f6b95f..988d427 100644
--- a/tests/Properties.hs
+++ b/tests/Properties.hs
@@ -50,7 +50,6 @@ import qualified Data.ByteString.Lazy.Char8 as LC
 import qualified Data.ByteString.Lazy.Char8 as D
 
 import qualified Data.ByteString.Lazy.Internal as LP
-import Data.ByteString.Fusion
 import Prelude hiding (abs)
 
 import Rules
diff --git a/tests/QuickCheckUtils.hs b/tests/QuickCheckUtils.hs
index e156366..075dca6 100644
--- a/tests/QuickCheckUtils.hs
+++ b/tests/QuickCheckUtils.hs
@@ -18,7 +18,6 @@ import System.Random
 import System.IO
 import Foreign.C (CChar)
 
-import Data.ByteString.Fusion
 import qualified Data.ByteString      as P
 import qualified Data.ByteString.Lazy as L
 import qualified Data.ByteString.Lazy.Internal as L 
(checkInvariant,ByteString(..))



_______________________________________________
Cvs-libraries mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-libraries

Reply via email to