Skip to content
Snippets Groups Projects
Commit 111ff632 authored by Austin Seipp's avatar Austin Seipp Committed by thoughtpolice
Browse files

testsuite: add a regression test for #10011


Signed-off-by: default avatarAustin Seipp <austin@well-typed.com>
(cherry picked from commit e02ef0e6)
parent 47cd08ab
No related branches found
No related tags found
No related merge requests found
......@@ -1046,6 +1046,7 @@ mk/ghcconfig*_inplace_bin_ghc-stage2.exe.mk
/tests/numeric/should_run/T7689
/tests/numeric/should_run/T8726
/tests/numeric/should_run/T9810
/tests/numeric/should_run/T10011
/tests/numeric/should_run/add2
/tests/numeric/should_run/arith001
/tests/numeric/should_run/arith002
......
{-# LANGUAGE ScopedTypeVariables, TypeOperators, GADTs #-}
module Main
( main -- :: IO ()
) where
import Data.Data
import Data.Ratio
main :: IO ()
main =
let bad = gmapT (\(x :: b) ->
case eqT :: Maybe (b :~: Integer) of
Nothing -> x;
Just Refl -> x * 2) (1 % 2) :: Rational
in print (bad == numerator bad % denominator bad)
True
......@@ -64,3 +64,4 @@ test('NumDecimals', normal, compile_and_run, [''])
test('T8726', normal, compile_and_run, [''])
test('CarryOverflow', omit_ways(['ghci']), compile_and_run, [''])
test('T9810', normal, compile_and_run, [''])
test('T10011', 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