Skip to content
Snippets Groups Projects
Commit 1c050ed2 authored by Matthew Pickering's avatar Matthew Pickering Committed by Marge Bot
Browse files

Add test for T22671

This was fixed by b13c6ea5

Closes #22671
parent 34d2d463
No related branches found
No related tags found
No related merge requests found
Pipeline #62013 passed with warnings
module Main where
import Data.Bits
import Control.Monad
main :: IO ()
main = unless (length (show (1 `shiftL` (1 `shiftL` 20) :: Integer)) == 315653)
(error "Incorrect result for bignum calculation")
......@@ -79,4 +79,5 @@ test('IntegerToFloat', normal, compile_and_run, [''])
test('T20291', normal, compile_and_run, [''])
test('T22282', normal, compile_and_run, [''])
test('T22671', normal, compile_and_run, [''])
test('foundation', normal, compile_and_run, ['-O -package transformers'])
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment