[Git][ghc/ghc][master] Add regression test for #22151

Marge Bot (@marge-bot) gitlab at gitlab.haskell.org
Thu Jan 19 03:26:23 UTC 2023



Marge Bot pushed to branch master at Glasgow Haskell Compiler / GHC


Commits:
154889db by Ryan Scott at 2023-01-18T22:26:03-05:00
Add regression test for #22151

Issue #22151 was coincidentally fixed in commit
aed1974e92366ab8e117734f308505684f70cddf (`Refactor the treatment of loopy
superclass dicts`). This adds a regression test to ensure that the issue
remains fixed.

Fixes #22151.

- - - - -


2 changed files:

- + testsuite/tests/warnings/should_compile/T22151.hs
- testsuite/tests/warnings/should_compile/all.T


Changes:

=====================================
testsuite/tests/warnings/should_compile/T22151.hs
=====================================
@@ -0,0 +1,16 @@
+{-# LANGUAGE UndecidableInstances #-}
+module T22151 where
+
+import Control.Monad.IO.Class (MonadIO(liftIO))
+
+class (Applicative m, Monad m) => C m where
+  m :: m ()
+
+-- This should not emit a -Wredundant-constraints warning. This is because
+-- GHC should not expand the superclasses of the Given constraint `MonadIO m`
+-- given that it is not Paterson-smaller than the instance head `C m`. (See
+-- Note [Recursive superclasses] in GHC.Tc.TyCl.Instance for more on what
+-- "Paterson-smaller" means.) As a result, we must provide the `Applicative m`
+-- and `Monad m` constraints explicitly.
+instance (Applicative m, Monad m, MonadIO m) => C m where
+  m = liftIO (pure ())


=====================================
testsuite/tests/warnings/should_compile/all.T
=====================================
@@ -53,4 +53,5 @@ test('DerivingTypeable', normal, compile, ['-Wderiving-typeable'])
 test('T18862a', normal, compile, [''])
 test('T18862b', normal, compile, [''])
 test('T20312', normal, compile,['-Wall'])
+test('T22151', normal, compile, ['-Wredundant-constraints'])
 test('T22759', normal, compile, [''])



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/154889dbfbef62ad58a28df4171bf767cc690c2a

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/154889dbfbef62ad58a28df4171bf767cc690c2a
You're receiving this email because of your account on gitlab.haskell.org.


-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20230118/4c294d9e/attachment-0001.html>


More information about the ghc-commits mailing list