Problem with Unboxed Types

26 Aug
2004
26 Aug
'04
9:54 p.m.
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.
7572
Age (days ago)
7572
Last active (days ago)
0 comments
1 participants
participants (1)
-
Jorge Adriano Aires