Repository : ssh://darcs.haskell.org//srv/darcs/packages/integer-gmp

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/ebc96919582ead679984dbddec4e169a7c1957a0

>---------------------------------------------------------------

commit ebc96919582ead679984dbddec4e169a7c1957a0
Author: Ian Lynagh <[email protected]>
Date:   Tue Sep 13 19:48:38 2011 +0100

    NOINLINE a couple more functions
    
    We don't need them to be inlined at all, following changes in how
    GHC handles Integers.

>---------------------------------------------------------------

 GHC/Integer/Type.lhs |    4 ++--
 1 files changed, 2 insertions(+), 2 deletions(-)

diff --git a/GHC/Integer/Type.lhs b/GHC/Integer/Type.lhs
index d74b2f7..eef256b 100644
--- a/GHC/Integer/Type.lhs
+++ b/GHC/Integer/Type.lhs
@@ -72,11 +72,11 @@ data Integer
    = S# Int#                            -- small integers
    | J# Int# ByteArray#                 -- large integers
 
-{-# INLINE [0] smallInteger #-}
+{-# NOINLINE smallInteger #-}
 smallInteger :: Int# -> Integer
 smallInteger i = S# i
 
-{-# INLINE [0] wordToInteger #-}
+{-# NOINLINE wordToInteger #-}
 wordToInteger :: Word# -> Integer
 wordToInteger w = case word2Integer# w of (# s, d #) -> J# s d
 



_______________________________________________
Cvs-libraries mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-libraries

Reply via email to