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]
- RE: specialization S.D.Mechveliani
- RE: specialization Simon Peyton-Jones
