Skip to content
Snippets Groups Projects
Commit e5ceff56 authored by Ben Gamari's avatar Ben Gamari Committed by Marge Bot
Browse files

testsuite: Add test for #21962

parent 50912d68
No related branches found
No related tags found
No related merge requests found
Pipeline #55518 failed
Pipeline: head.hackage

#55522

    Pipeline: head.hackage

    #55521

      {-# LANGUAGE UnboxedTuples #-}
      {-# LANGUAGE MagicHash #-}
      module Main where
      import GHC.IO
      import GHC.Exts
      main :: IO ()
      main = do
      IO $ \s0 -> case newArray# 0# () s0 of (# s1, arr #) -> (# s1, () #)
      ......@@ -23,3 +23,4 @@ test('arr017', when(fast(), skip), compile_and_run, [''])
      test('arr018', when(fast(), skip), compile_and_run, [''])
      test('arr019', normal, compile_and_run, [''])
      test('arr020', normal, compile_and_run, [''])
      test('T21962', normal, compile_and_run, [''])
      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