#5126: Splicing a type into a signature decl within a decl quotation panics with
"mkUsageInfo: internal name? x2{v a2pX}"
-----------------------+----------------------------------------------------
Reporter: FSalad | Owner:
Type: bug | Status: new
Priority: normal | Component: Template Haskell
Version: 7.0.3 | Keywords: quotation
Testcase: | Blockedby:
Os: Linux | Blocking:
Architecture: x86 | Failure: Compile-time crash
-----------------------+----------------------------------------------------
Comment(by FSalad):
Nevermind the attached code; I minimized it down to:
{{{
{-# LANGUAGE TemplateHaskell #-}
module THUtil where
import Language.Haskell.TH
import Language.Haskell.TH.Syntax
f :: DecsQ
f =
[d|
x2 :: $(conT ''Int)
x2 = undefined
|]
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/5126#comment:2>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs