Armin Groesslinger <[EMAIL PROTECTED]> wrote,

> -----------------------
> module Main where
> 
> import CForeign
> 
> foreign import "puts" puts :: CString -> IO ()
> 
> main :: IO ()
> main = return ()
> -----------------------
> 
> to ghci-5.00 (with ghci -package lang -fglasgow-exts Main.hs
> on x86/Linux) gives the following error:
> 
> Compiling Main             ( Main.hs, interpreted )
> ghc-5.00: panic! (the `impossible' happened, GHC version 5.00):
>         bytecode generator can't handle unboxed tuples

The interpreter does not support foreign declarations yet.
You can only use them with the batch compiler.

Manuel



_______________________________________________
Glasgow-haskell-bugs mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to