#4469: recompilation or build system bug
---------------------------------+------------------------------------------
Reporter: igloo | Owner:
Type: bug | Status: new
Priority: normal | Milestone: 7.0.2
Component: Build System | Version: 6.12.3
Keywords: | Testcase:
Blockedby: | Difficulty:
Os: Unknown/Multiple | Blocking:
Architecture: Unknown/Multiple | Failure: None/Unknown
---------------------------------+------------------------------------------
Comment(by igloo):
{{{
hunk ./GHC/Word.hs 216
abs x = x
signum 0 = 0
signum _ = 1
+ {-# INLINE fromInteger #-}
fromInteger i = W8# (narrow8Word# (integerToWord i))
instance Real Word8 where
hunk ./GHC/Word.hs 229
pred x
| x /= minBound = x - 1
| otherwise = predError "Word8"
+ {-# INLINE toEnum #-}
toEnum i@(I# i#)
| i >= 0 && i <= fromIntegral (maxBound::Word8)
= W8# (int2Word# i#)
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/4469#comment:2>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs