[commit: ghc] master: T9181: Fix testsuite output (4e74ef9)
git at git.haskell.org
git at git.haskell.org
Tue Nov 17 12:57:55 UTC 2015
Repository : ssh://git@git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/4e74ef96960187bba2848a73f5899c8807bb2a39/ghc
>---------------------------------------------------------------
commit 4e74ef96960187bba2848a73f5899c8807bb2a39
Author: Ben Gamari <bgamari.foss at gmail.com>
Date: Tue Nov 17 06:20:30 2015 -0500
T9181: Fix testsuite output
I'm not really sure how this one snuck through my local validation. Hmm.
>---------------------------------------------------------------
4e74ef96960187bba2848a73f5899c8807bb2a39
testsuite/tests/ghci/scripts/T9181.stdout | 6 ++++++
1 file changed, 6 insertions(+)
diff --git a/testsuite/tests/ghci/scripts/T9181.stdout b/testsuite/tests/ghci/scripts/T9181.stdout
index 3ea130d..15504ec 100644
--- a/testsuite/tests/ghci/scripts/T9181.stdout
+++ b/testsuite/tests/ghci/scripts/T9181.stdout
@@ -5,6 +5,11 @@ type (<=) (x :: Nat) (y :: Nat) = (x <=? y) ~ 'True
type family (<=?) (a :: Nat) (b :: Nat) :: Bool
type family CmpNat (a :: Nat) (b :: Nat) :: Ordering
type family CmpSymbol (a :: Symbol) (b :: Symbol) :: Ordering
+data ErrorMessage where
+ Text :: Symbol -> ErrorMessage
+ ShowType :: t -> ErrorMessage
+ (:<>:) :: ErrorMessage -> ErrorMessage -> ErrorMessage
+ (:$$:) :: ErrorMessage -> ErrorMessage -> ErrorMessage
class KnownNat (n :: Nat) where
natSing :: SNat n
{-# MINIMAL natSing #-}
@@ -15,6 +20,7 @@ data SomeNat where
SomeNat :: KnownNat n => (Proxy n) -> SomeNat
data SomeSymbol where
SomeSymbol :: KnownSymbol n => (Proxy n) -> SomeSymbol
+type family TypeError (a :: ErrorMessage) :: b where
type family (^) (a :: Nat) (b :: Nat) :: Nat
natVal :: KnownNat n => proxy n -> Integer
natVal' :: KnownNat n => Proxy# n -> Integer
More information about the ghc-commits
mailing list