Alas, all too true. 'SPECIALISE instance' is ignored right now.
We should produce a message to say so.
If this is really hitting someone's performance pls yell.
Simon
> -----Original Message-----
> From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED]]
> Sent: Wednesday, March 24, 1999 9:52 AM
> To: [EMAIL PROTECTED]
> Subject: specialization
>
>
> Applying ghc-4.02 -c -O -optC-fshow-specializations
> to
> module T where
> f :: Num a => a -> a
> f n = n*(f (n-1))
> {-# SPECIALIZE f :: Int -> Int #-}
>
> instance Num a => Num [a] where negate = map negate
> {-# SPECIALIZE instance Num [Int] #-}
>
> we see that
> T.hi mentions f and its specialization f1,
> `SPECIALIZE instance' does not seem to change anything,
> neither do -optC-fshow-specializations.
>
> Please, advise.
>
> ------------------
> Sergey Mechveliani
> [EMAIL PROTECTED]
>