What is going on here? Is it already fixed in 6.1?

# uname -a
Linux denebola 2.4.19-4GB #2 Mon Mar 31 10:57:24 CEST 2003 i686 unknown
# ghc DynExcep.hs -c -fglasgow-exts
# ghci
   ___         ___ _
  / _ \ /\  /\/ __(_)
 / /_\// /_/ / /  | |      GHC Interactive, version 6.0, for Haskell 98.
/ /_\\/ __  / /___| |      http://www.haskell.org/ghc/
\____/\/ /_/\____/|_|      Type :? for help.

Loading package base ... linking ... done.
GHC.Err.error :: forall a. [Char] -> a
Prelude> :module + DynExcep
Prelude DynExcep> dynExcep
Segmentation fault
module DynExcep where

import Data.Dynamic
import Control.Exception

data FallOutExcep = FallOutExcep {
   fallOutId :: Int,
   mess :: String
   } deriving (Typeable)

type BreakFn = (forall other . String -> other)

mkBreakFn :: Int -> BreakFn
mkBreakFn id mess = throwDyn (FallOutExcep {fallOutId = id,mess = mess})

dynExcep = mkBreakFn 1 ""

Reply via email to