Skip to content

can't find interface-file declaration

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

The code is

{-# 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
Edited by Simon Peyton Jones
To upload designs, you'll need to enable LFS and have an admin enable hashed storage. More information