L.S.,

consider the following code:

> module TestZ where
>
> import Data.Generics
>
> data TestZ = TestZ { testz :: Int }
>            deriving (Show, Read, Eq, Typeable, Data)
>
> main = print $ constrFields . toConstr $ TestZ { testz = 2 }

I would expect this to output ["testz"]. Instead it outputs ["testzz"],
using GHCi 6.4.1. Why is that z doubled?

Doei, Arthur.

-- /\ / | [EMAIL PROTECTED] | Work like you don't need the money /__\ / | A friend is someone with whom | Love like you have never been hurt / \/__ | you can dare to be yourself | Dance like there's nobody watching



_______________________________________________
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell

Reply via email to