Problem with Unboxed Types

Jorge Adriano Aires jadrian at mat.uc.pt
Thu Aug 26 21:54:48 EDT 2004


Hello, 
I'd like to try using Unboxed types, but I always get a "parse error on input 
`#'" error. To make sure I wasn't making some mistake I tried the example in 
the wiki:

http://www.haskell.org/hawiki/UnboxedType
--------------------------------------------------------
module Main where 
import GHC.Exts

showUnboxedInt :: Int# -> String
showUnboxedInt n = (show $ I# n) ++ "#"
--------------------------------------------------------

Even tried adding fglasgow-exts, nothing works though. I'm using GHC 6.2.1 on 
a SuSE 8.2 system (glibc 2.3) installed using the available RPMs. Any idea?

Thanks in advance,
J.A.



More information about the Glasgow-haskell-users mailing list