{-

The following piece of program produces:

panic! (the `impossible' happened):
        applyTypeToArgs
    (__coerce (f{-ar4-} (<THIS>.FixTest.Fix{-r2,x-} f{-ar4-}))
     zddFunctor{-ari-})
        x{-arb-}

Some details:

- It loads if I remove the context in the Fix declaration:
     newtype Fix f = In {out :: f (Fix f) }
- It loads ok with Hugs98
- I am using ghc 4.08 and the problem arises both in Debian Linux and in
        Win32

BTW, I was looking for a list of known bugs in ghc but I couldn't find it.
        Does it exist?

Best Regards, Jose Labra
http://lsi.uniovi.es/~labra

-}
module FixTest where

newtype (Functor f) => Fix f = In { out :: f (Fix f) } 

para g x = g (fmap (para g) (out x)) x






Reply via email to