Skip to content
Snippets Groups Projects
Commit 054abe3d authored by Ben Gamari's avatar Ben Gamari
Browse files

testsuite: Add testcase for #14754

(cherry picked from commit 606edbfb)
parent f0cae1f2
No related branches found
No related tags found
No related merge requests found
module Main where
import Debug.Trace
main :: IO ()
main = print (alg 3 1)
alg :: Word -> Word -> Word
alg a b
| traceShow (a, b) False = undefined
| c < b = alg b c
| c > b = alg c b
| otherwise = c
where
c = a - b
(3,1)
(2,1)
1
......@@ -166,3 +166,4 @@ test('T13825-unit',
compile_and_run,
['-package ghc'])
test('T14619', normal, compile_and_run, [''])
test('T14754', 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