[GHC] #14811: Unary unboxed tuple field causes panic
GHC
ghc-devs at haskell.org
Thu Feb 15 02:17:03 UTC 2018
#14811: Unary unboxed tuple field causes panic
-------------------------------------+-------------------------------------
Reporter: dfeuer | Owner: (none)
Type: bug | Status: new
Priority: high | Milestone: 8.6.1
Component: Compiler | Version: 8.2.2
Keywords: | Operating System: Unknown/Multiple
Architecture: | Type of failure: Compile-time
Unknown/Multiple | crash or panic
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
Compiling this code under 8.2 or HEAD (but not 8.0), I get an error.
{{{#!hs
{-# language UnboxedTuples #-}
module Reccy where
data Foo a = Foo (# a #)
}}}
{{{
Reccy.hs:1:1: error:
Can't find interface-file declaration for variable GHC.Types.$tcUnit#
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
|
1 | -- {-# language GADTs, TypeOperators #-}
| ^
}}}
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/14811>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
More information about the ghc-tickets
mailing list