[GHC] #8847: Int64 ^ Int64 broken by optimization on SPARC
GHC
ghc-devs at haskell.org
Tue Mar 4 17:30:17 UTC 2014
#8847: Int64 ^ Int64 broken by optimization on SPARC
--------------------------+------------------------------------------------
Reporter: | Owner:
kgardas | Status: new
Type: bug | Milestone:
Priority: normal | Version:
Component: | Operating System: Solaris
Compiler (NCG) | Type of failure: Incorrect result at runtime
Keywords: | Test Case:
Architecture: sparc | Blocking:
Difficulty: |
Unknown |
Blocked By: |
Related Tickets: |
--------------------------+------------------------------------------------
The T7507 test is broken on SPARC NCG, I've more simplified it to
{{{
module Main where
import Data.Int
main = print ( ( 2 :: Int64 ) ^ ( 6 :: Int64 ) )
}}}
it does not matter if it's run with two Int64 or just with one:
{{{
main = print ( 2 ^ 6 :: Int64 )
}}}
the result with -O is still 0. The result without -O is correct.
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8847>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
More information about the ghc-tickets
mailing list