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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/e73bd57a6bf29d0dac996fc7411cf2a3aab64218

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

commit e73bd57a6bf29d0dac996fc7411cf2a3aab64218
Author: Simon Marlow <[email protected]>
Date:   Fri Jul 8 16:49:15 2011 +0100

    fix warning

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

 Data/Typeable.hs-boot |    1 -
 1 files changed, 0 insertions(+), 1 deletions(-)

diff --git a/Data/Typeable.hs-boot b/Data/Typeable.hs-boot
index 38ba334..a404f73 100644
--- a/Data/Typeable.hs-boot
+++ b/Data/Typeable.hs-boot
@@ -3,7 +3,6 @@
 module Data.Typeable where
 
 import Data.Maybe
-import GHC.Base
 import {-# SOURCE #-} Data.Typeable.Internal
 
 mkTyConApp   :: TyCon -> [TypeRep] -> TypeRep



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

Reply via email to