[GHC] #12596: can't find interface-file declaration
GHC
ghc-devs at haskell.org
Tue Sep 13 18:09:39 UTC 2016
#12596: can't find interface-file declaration
-------------------------------------+-------------------------------------
Reporter: mwotton | Owner:
Type: bug | Status: new
Priority: normal | Milestone:
Component: Compiler | Version: 8.0.1
Keywords: | Operating System: Unknown/Multiple
Architecture: | Type of failure: None/Unknown
Unknown/Multiple |
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
full repro at https://github.com/mwotton/liftwoes/issues/1
```
/home/mark/projects/liftwoes/src/Lib.hs:14:11: error:
• Can't find interface-file declaration for variable
Data.Text.Internal.pack
Probable cause: bug in .hi-boot file, or inconsistent .hi file
Use -ddump-if-trace to get an idea of which file caused the error
• In the first argument of ‘(:)’, namely
‘Data.Text.Internal.pack ((:) 'A' [])’
In the first argument of ‘HS.fromList’, namely
```
{{{#!hs
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}
module Lib where
import Data.Data
import qualified Data.Set as HS
import qualified Data.Text as T
import qualified Data.Text.IO as T
import Data.Time
-- import Instances.TH.Lift
import Instances
import Language.Haskell.TH.Syntax
table = $(do r <- runIO (HS.fromList . T.lines <$> T.readFile
"/usr/share/dict/words")
[|r|] )
someFunc = do
print $ HS.member "foo" table
}}}
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/12596>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
More information about the ghc-tickets
mailing list