[GHC] #7963: -ddump-minimal-imports should preserve "hiding" imports

GHC ghc-devs at haskell.org
Wed Jun 5 21:32:00 CEST 2013


#7963: -ddump-minimal-imports should preserve "hiding" imports
-----------------------------+----------------------------------------------
Reporter:  dsf               |          Owner:                  
    Type:  bug               |         Status:  new             
Priority:  normal            |      Component:  Compiler        
 Version:  7.6.2             |       Keywords:                  
      Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
 Failure:  None/Unknown      |      Blockedby:                  
Blocking:                    |        Related:                  
-----------------------------+----------------------------------------------
 An input file like

 {{{
 {-# LANGUAGE OverloadedStrings #-}
 module Hiding where

 import Prelude hiding (writeFile, unlines)
 import Data.Text (unlines)
 import Data.Text.IO (writeFile)

 main :: IO ()
 main = writeFile "/tmp/foo" (unlines ["hello", "world"])
 }}}

 compiled with -ddump-minimal-imports produces a .imports file containing

 {{{
 import Data.Text ( unlines )
 import Data.Text.IO ( writeFile )
 }}}

 Without the import of Prelude the original file won't compile with the new
 imports.

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7963>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler



More information about the ghc-tickets mailing list