Skip to content
GitLab
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 5,407
    • Issues 5,407
    • List
    • Boards
    • Service Desk
    • Milestones
    • Iterations
  • Merge requests 600
    • Merge requests 600
  • 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 CompilerGlasgow Haskell Compiler
  • GHCGHC
  • Issues
  • #13499
Closed
Open
Issue created Mar 30, 2017 by Otini@trac-Otini

"Panic: no skolem info" with StaticPointers and typed hole

When compiling this minimal example:

{-# LANGUAGE StaticPointers #-}

import Data.Typeable (Typeable)
import GHC.StaticPtr (StaticPtr)

f :: Typeable a => StaticPtr (a -> a)
f = static (\a -> _)

main :: IO ()
main = return ()

I get this output:

Bug.hs:8:19: error:ghc: panic! (the 'impossible' happened)
  (GHC version 8.0.1 for x86_64-unknown-linux):
	No skolem info: a_aJo[sk]

Please report this as a GHC bug:  http://www.haskell.org/ghc/reportabug

Unlike similar reported bugs, this happens on both 8.0.1 and 8.0.2.

Edit: no need to activate GADTs.

Edited Mar 10, 2019 by Otini
To upload designs, you'll need to enable LFS and have an admin enable hashed storage. More information
Assignee
Assign to
Time tracking