[GHC] #8281: The impossible happened: primRepToFFIType

GHC ghc-devs at haskell.org
Fri Sep 13 05:58:24 CEST 2013


#8281: The impossible happened: primRepToFFIType
---------------------------------------+-----------------------------------
        Reporter:  tibbe               |            Owner:
            Type:  bug                 |           Status:  new
        Priority:  normal              |        Milestone:
       Component:  Compiler            |          Version:  7.6.2
      Resolution:                      |         Keywords:
Operating System:  Unknown/Multiple    |     Architecture:
 Type of failure:  Compile-time crash  |  Unknown/Multiple
       Test Case:                      |       Difficulty:  Unknown
        Blocking:                      |       Blocked By:
                                       |  Related Tickets:
---------------------------------------+-----------------------------------

Comment (by monoidal):

 Confirmed in HEAD. To reproduce, save this file as Class.hs and run ghci
 Class (not merely ghc).

 {{{
 {-# LANGUAGE ForeignFunctionInterface, MagicHash, UnliftedFFITypes #-}

 module Data.Hashable.Class () where

 import GHC.Prim (ThreadId#)
 import Foreign.C.Types (CInt(..))

 foreign import ccall unsafe "rts_getThreadId" getThreadId :: ThreadId# ->
 CInt
 }}}

-- 
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8281#comment:1>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler



More information about the ghc-tickets mailing list