Skip to content

Commit

Permalink
Test case for #9938
Browse files Browse the repository at this point in the history
Marked as known_broken
  • Loading branch information
nomeata committed Dec 29, 2014
1 parent 4e1e776 commit 65e3e0b
Show file tree
Hide file tree
Showing 3 changed files with 23 additions and 0 deletions.
6 changes: 6 additions & 0 deletions testsuite/tests/driver/Makefile
Original file line number Diff line number Diff line change
Expand Up @@ -586,3 +586,9 @@ write_interface_make:
$(RM) -rf write_interface_make/A011.hi
"$(TEST_HC)" $(TEST_HC_OPTS) -hidir write_interface_make -fno-code -fwrite-interface --make A011.hs
test -f write_interface_make/A011.hi

.PHONY: T9938
T9938:
$(RM) -rf T9938.o T9938.hi T9938
"$(TEST_HC)" -c T9938.hs
"$(TEST_HC)" T9938.o -o T9938
13 changes: 13 additions & 0 deletions testsuite/tests/driver/T9938.hs
Original file line number Diff line number Diff line change
@@ -0,0 +1,13 @@
module Main where

import Control.Monad
import Control.Monad.Trans.State

solve :: Int -> StateT () [] ()
solve carry | carry > 0 =
do guard (0 == carry)
solve (carry -1)
solve 0 = mzero

main :: IO ()
main = return ()
4 changes: 4 additions & 0 deletions testsuite/tests/driver/all.T
Original file line number Diff line number Diff line change
Expand Up @@ -410,3 +410,7 @@ test('write_interface_make', normal, run_command, ['$MAKE -s --no-print-director

test('T9776', normal, compile_fail, ['-frule-check'])

test('T9938',
[ extra_clean(['T9938.hi', 'T9938.o', 'T9938']), expect_broken(9938)],
run_command,
['$MAKE -s --no-print-directory T9938'])

0 comments on commit 65e3e0b

Please sign in to comment.