[Git][ghc/ghc][wip/cfuneqcan-refactor] 2 commits: A few error message wibbles
Richard Eisenberg
gitlab at gitlab.haskell.org
Fri Oct 23 20:56:44 UTC 2020
Richard Eisenberg pushed to branch wip/cfuneqcan-refactor at Glasgow Haskell Compiler / GHC
Commits:
3b096c57 by Richard Eisenberg at 2020-10-23T16:55:19-04:00
A few error message wibbles
- - - - -
cdc73a4c by Richard Eisenberg at 2020-10-23T16:56:32-04:00
Fix trailing whitespace to appease linter
- - - - -
5 changed files:
- testsuite/tests/indexed-types/should_fail/Simple13.hs
- testsuite/tests/indexed-types/should_fail/T13784.stderr
- testsuite/tests/partial-sigs/should_compile/T14715.stderr
- testsuite/tests/typecheck/should_compile/PolytypeDecomp.stderr
- testsuite/tests/typecheck/should_compile/T5490.hs
Changes:
=====================================
testsuite/tests/indexed-types/should_fail/Simple13.hs
=====================================
@@ -21,7 +21,7 @@ foo p = same p (mkf p)
[G] g : a ~ [F a]
[W] w : a ~ [F a]
---->
+--->
g' = g;[x] g'=aq4
[G] g' : a ~ [fsk] g=aqW
[W] x : F a ~ fsk x=aq3
@@ -36,7 +36,7 @@ foo p = same p (mkf p)
w = g' ; w2
[W] w2 : [fsk] ~ [F a]
- --> decompose
+ --> decompose
w2 = [w3]
[W] w3 : fsk ~ F a
@@ -44,5 +44,5 @@ foo p = same p (mkf p)
cycle is
aq3 = Sym (F aq4) ; aq5 x = Sym (F g') ; x2
- aq4 = apw ; aq3 g' =
+ aq4 = apw ; aq3 g' =
-}
=====================================
testsuite/tests/indexed-types/should_fail/T13784.stderr
=====================================
@@ -15,7 +15,7 @@ T13784.hs:29:28: error:
T13784.hs:33:24: error:
• Couldn't match type: Product (a : as0)
- with: (b, Product (Divide b (a : as)))
+ with: (b, Product (a : Divide b as))
Expected: (b, Product (Divide b (a : as)))
Actual: Product (a1 : as0)
• In the expression: a :* divide as
=====================================
testsuite/tests/partial-sigs/should_compile/T14715.stderr
=====================================
@@ -1,11 +1,11 @@
T14715.hs:13:53: warning: [-Wpartial-type-signatures (in -Wdefault)]
- • Found type wildcard ‘_’ standing for ‘Reduce (LiftOf zq) zq’
- Where: ‘zq’ is a rigid type variable bound by
+ • Found type wildcard ‘_’ standing for ‘Reduce z zq’
+ Where: ‘z’, ‘zq’ are rigid type variables bound by
the inferred type of
bench_mulPublic :: (z ~ LiftOf zq, Reduce (LiftOf zq) zq) =>
Cyc zp -> Cyc z -> IO (zp, zq)
- at T14715.hs:13:32-33
+ at T14715.hs:13:27-33
• In the type signature:
bench_mulPublic :: forall z zp zq.
(z ~ LiftOf zq, _) => Cyc zp -> Cyc z -> IO (zp, zq)
=====================================
testsuite/tests/typecheck/should_compile/PolytypeDecomp.stderr
=====================================
@@ -8,13 +8,3 @@ PolytypeDecomp.hs:30:17: error:
• In the expression: x
In the first argument of ‘myLength’, namely ‘[x, f]’
In the expression: myLength [x, f]
-
-PolytypeDecomp.hs:30:19: error:
- • Couldn't match type ‘a0’ with ‘[forall a. F [a]]’
- Expected: Id a0
- Actual: [forall a. F [a]]
- Cannot instantiate unification variable ‘a0’
- with a type involving polytypes: [forall a. F [a]]
- • In the expression: f
- In the first argument of ‘myLength’, namely ‘[x, f]’
- In the expression: myLength [x, f]
=====================================
testsuite/tests/typecheck/should_compile/T5490.hs
=====================================
@@ -16,7 +16,7 @@ import Data.Functor
import Control.Exception
data Attempt α = Success α
- | ∀ e . Exception e ⇒ Failure e
+ | ∀ e . Exception e ⇒ Failure e
fromAttempt ∷ Attempt α → IO α
fromAttempt (Success a) = return a
@@ -136,7 +136,7 @@ instance IsPeano PZero where
peano = PZero
instance IsPeano p ⇒ IsPeano (PSucc p) where
- peano = PSucc peano
+ peano = PSucc peano
class (n ~ PSucc (PPred n)) ⇒ PHasPred n where
type PPred n
@@ -297,4 +297,3 @@ hGetIfNth _ _ = Nothing
elem0 ∷ HNonEmpty l ⇒ HElemOf l → Maybe (HHead l)
elem0 = hGetIfNth PZero
-
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/compare/fd69f2b1ddb2330a25847312964d7f7a939602dd...cdc73a4c3e789c7725e594b7582896301d77f8c7
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/compare/fd69f2b1ddb2330a25847312964d7f7a939602dd...cdc73a4c3e789c7725e594b7582896301d77f8c7
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/20201023/a2615e75/attachment-0001.html>
More information about the ghc-commits
mailing list