Skip to content

GitLab

  • Menu
Projects Groups Snippets
  • Help
    • Help
    • Support
    • Community forum
    • Submit feedback
  • Sign in / Register
  • GHC GHC
  • Project information
    • Project information
    • Activity
    • Labels
    • Members
  • Repository
    • Repository
    • Files
    • Commits
    • Branches
    • Tags
    • Contributors
    • Graph
    • Compare
    • Locked Files
  • Issues 4,870
    • Issues 4,870
    • List
    • Boards
    • Service Desk
    • Milestones
    • Iterations
  • Merge requests 453
    • Merge requests 453
  • CI/CD
    • CI/CD
    • Pipelines
    • Jobs
    • Schedules
    • Test Cases
  • Deployments
    • Deployments
    • Releases
  • Analytics
    • Analytics
    • Value stream
    • CI/CD
    • Code review
    • Insights
    • Issue
    • Repository
  • Wiki
    • Wiki
  • Snippets
    • Snippets
  • Activity
  • Graph
  • Create a new issue
  • Jobs
  • Commits
  • Issue Boards
Collapse sidebar
  • Glasgow Haskell Compiler
  • GHCGHC
  • Issues
  • #12596
Closed
Open
Created Sep 13, 2016 by mwotton@trac-mwotton

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 Mar 10, 2019 by Simon Peyton Jones
To upload designs, you'll need to enable LFS and have an admin enable hashed storage. More information
Assignee
Assign to
Time tracking