diff options
Diffstat (limited to 'testsuite')
16 files changed, 75 insertions, 75 deletions
diff --git a/testsuite/tests/ado/ado004.stderr b/testsuite/tests/ado/ado004.stderr index 6a39e6d142..8f5a816612 100644 --- a/testsuite/tests/ado/ado004.stderr +++ b/testsuite/tests/ado/ado004.stderr @@ -3,11 +3,11 @@ TYPE SIGNATURES forall (f :: * -> *). Applicative f => (Int -> f Int) -> f Int test2 :: forall t b (f :: * -> *). - (Applicative f, Num t, Num b) => + (Num b, Num t, Applicative f) => (t -> f b) -> f b test2a :: forall t b (f :: * -> *). - (Num t, Num b, Functor f) => + (Num b, Num t, Functor f) => (t -> f b) -> f b test2b :: forall (m :: * -> *) a t. (Num t, Monad m) => (t -> a) -> m a diff --git a/testsuite/tests/ghc-api/apirecomp001/apirecomp001.stderr b/testsuite/tests/ghc-api/apirecomp001/apirecomp001.stderr index 80b94dca4b..52385104cf 100644 --- a/testsuite/tests/ghc-api/apirecomp001/apirecomp001.stderr +++ b/testsuite/tests/ghc-api/apirecomp001/apirecomp001.stderr @@ -3,14 +3,14 @@ B.hs:4:1: warning: [-Wmissing-signatures] Top-level binding with no type signature: answer_to_live_the_universe_and_everything :: Int -B.hs:5:12: warning: [-Wtype-defaults] +B.hs:5:13: warning: [-Wtype-defaults] • Defaulting the following constraints to type ‘Integer’ + (Num a0) arising from the literal ‘1’ at B.hs:5:13 (Enum a0) arising from the arithmetic sequence ‘1 .. 23 * 2’ at B.hs:5:12-20 - (Num a0) arising from the literal ‘1’ at B.hs:5:13 - • In the first argument of ‘length’, namely ‘[1 .. 23 * 2]’ + • In the expression: 1 + In the first argument of ‘length’, namely ‘[1 .. 23 * 2]’ In the first argument of ‘(-)’, namely ‘length [1 .. 23 * 2]’ - In the expression: length [1 .. 23 * 2] - 4 A.hs:7:1: warning: [-Wmissing-signatures] Top-level binding with no type signature: main :: IO () @@ -19,14 +19,14 @@ B.hs:4:1: warning: [-Wmissing-signatures] Top-level binding with no type signature: answer_to_live_the_universe_and_everything :: Int -B.hs:5:12: warning: [-Wtype-defaults] +B.hs:5:13: warning: [-Wtype-defaults] • Defaulting the following constraints to type ‘Integer’ + (Num a0) arising from the literal ‘1’ at B.hs:5:13 (Enum a0) arising from the arithmetic sequence ‘1 .. 23 * 2’ at B.hs:5:12-20 - (Num a0) arising from the literal ‘1’ at B.hs:5:13 - • In the first argument of ‘length’, namely ‘[1 .. 23 * 2]’ + • In the expression: 1 + In the first argument of ‘length’, namely ‘[1 .. 23 * 2]’ In the first argument of ‘(-)’, namely ‘length [1 .. 23 * 2]’ - In the expression: length [1 .. 23 * 2] - 4 A.hs:7:1: warning: [-Wmissing-signatures] Top-level binding with no type signature: main :: IO () diff --git a/testsuite/tests/indexed-types/should_compile/T3017.stderr b/testsuite/tests/indexed-types/should_compile/T3017.stderr index bedb722475..a3489d23bd 100644 --- a/testsuite/tests/indexed-types/should_compile/T3017.stderr +++ b/testsuite/tests/indexed-types/should_compile/T3017.stderr @@ -4,7 +4,7 @@ TYPE SIGNATURES emptyL :: forall a. ListColl a insert :: forall c. Coll c => Elem c -> c -> c test2 :: - forall t t1 c. (Elem c ~ (t, t1), Coll c, Num t1, Num t) => c -> c + forall t t1 c. (Elem c ~ (t, t1), Coll c, Num t, Num t1) => c -> c TYPE CONSTRUCTORS class Coll c where type family Elem c :: * open diff --git a/testsuite/tests/parser/should_compile/T2245.stderr b/testsuite/tests/parser/should_compile/T2245.stderr index 7a4e868c9f..c2bc8da935 100644 --- a/testsuite/tests/parser/should_compile/T2245.stderr +++ b/testsuite/tests/parser/should_compile/T2245.stderr @@ -11,12 +11,12 @@ T2245.hs:5:10: warning: [-Wmissing-methods (in -Wdefault)] ‘fromRational’ and (either ‘recip’ or ‘/’) • In the instance declaration for ‘Fractional T’ -T2245.hs:7:29: warning: [-Wtype-defaults (in -Wall)] +T2245.hs:7:27: warning: [-Wtype-defaults (in -Wall)] • Defaulting the following constraints to type ‘T’ + (Ord a0) arising from an operator section at T2245.hs:7:27-33 (Fractional a0) arising from the literal ‘1e400’ at T2245.hs:7:29-33 - (Ord a0) arising from an operator section at T2245.hs:7:27-33 (Read a0) arising from a use of ‘read’ at T2245.hs:7:38-41 - • In the second argument of ‘(<)’, namely ‘1e400’ - In the first argument of ‘(.)’, namely ‘(< 1e400)’ + • In the first argument of ‘(.)’, namely ‘(< 1e400)’ In the second argument of ‘(.)’, namely ‘(< 1e400) . read’ + In the second argument of ‘($)’, namely ‘show . (< 1e400) . read’ diff --git a/testsuite/tests/partial-sigs/should_compile/ExtraConstraints1.stderr b/testsuite/tests/partial-sigs/should_compile/ExtraConstraints1.stderr index 0f0d6f91b2..83c22b61af 100644 --- a/testsuite/tests/partial-sigs/should_compile/ExtraConstraints1.stderr +++ b/testsuite/tests/partial-sigs/should_compile/ExtraConstraints1.stderr @@ -1,6 +1,6 @@ TYPE SIGNATURES - arbitCs1 :: forall a. (Show a, Eq a, Enum a) => a -> String - arbitCs2 :: forall a. (Show a, Eq a, Enum a) => a -> String + arbitCs1 :: forall a. (Eq a, Enum a, Show a) => a -> String + arbitCs2 :: forall a. (Show a, Enum a, Eq a) => a -> String arbitCs3 :: forall a. (Show a, Enum a, Eq a) => a -> String arbitCs4 :: forall a. (Eq a, Show a, Enum a) => a -> String arbitCs5 :: forall a. (Eq a, Enum a, Show a) => a -> String @@ -8,4 +8,4 @@ TYPE CONSTRUCTORS COERCION AXIOMS Dependent modules: [] Dependent packages: [base-4.9.0.0, ghc-prim-0.5.0.0, - integer-gmp-1.0.0.0] + integer-gmp-1.0.0.1] diff --git a/testsuite/tests/partial-sigs/should_compile/ExtraConstraints3.stderr b/testsuite/tests/partial-sigs/should_compile/ExtraConstraints3.stderr index ee31ed289c..5893c7ba55 100644 --- a/testsuite/tests/partial-sigs/should_compile/ExtraConstraints3.stderr +++ b/testsuite/tests/partial-sigs/should_compile/ExtraConstraints3.stderr @@ -39,7 +39,7 @@ TYPE SIGNATURES atan2 :: forall a. RealFloat a => a -> a -> a atanh :: forall a. Floating a => a -> a break :: forall a. (a -> Bool) -> [a] -> ([a], [a]) - ceiling :: forall b a. (RealFrac a, Integral b) => a -> b + ceiling :: forall b a. (Integral b, RealFrac a) => a -> b compare :: forall a. Ord a => a -> a -> Ordering concat :: forall (t :: * -> *) a. P.Foldable t => t [a] -> [a] concatMap :: @@ -56,7 +56,7 @@ TYPE SIGNATURES dropWhile :: forall a. (a -> Bool) -> [a] -> [a] either :: forall b c a. (a -> c) -> (b -> c) -> Either a b -> c elem :: - forall (t :: * -> *) a. (P.Foldable t, Eq a) => a -> t a -> Bool + forall (t :: * -> *) a. (Eq a, P.Foldable t) => a -> t a -> Bool encodeFloat :: forall a. RealFloat a => Integer -> Int -> a enumFrom :: forall a. Enum a => a -> [a] enumFromThen :: forall a. Enum a => a -> a -> [a] @@ -72,7 +72,7 @@ TYPE SIGNATURES floatDigits :: forall a. RealFloat a => a -> Int floatRadix :: forall a. RealFloat a => a -> Integer floatRange :: forall a. RealFloat a => a -> (Int, Int) - floor :: forall b a. (RealFrac a, Integral b) => a -> b + floor :: forall b a. (Integral b, RealFrac a) => a -> b fmap :: forall (f :: * -> *) b a. Functor f => (a -> b) -> f a -> f b foldl :: @@ -118,26 +118,26 @@ TYPE SIGNATURES map :: forall b a. (a -> b) -> [a] -> [b] mapM :: forall (t :: * -> *) (m :: * -> *) b a. - (P.Traversable t, Monad m) => + (Monad m, P.Traversable t) => (a -> m b) -> t a -> m (t b) mapM_ :: forall (t :: * -> *) (m :: * -> *) b a. - (P.Foldable t, Monad m) => + (Monad m, P.Foldable t) => (a -> m b) -> t a -> m () max :: forall a. Ord a => a -> a -> a maxBound :: forall t. Bounded t => t maximum :: - forall (t :: * -> *) a. (P.Foldable t, Ord a) => t a -> a + forall (t :: * -> *) a. (Ord a, P.Foldable t) => t a -> a maybe :: forall a b. b -> (a -> b) -> Maybe a -> b min :: forall a. Ord a => a -> a -> a minBound :: forall t. Bounded t => t minimum :: - forall (t :: * -> *) a. (P.Foldable t, Ord a) => t a -> a + forall (t :: * -> *) a. (Ord a, P.Foldable t) => t a -> a mod :: forall a. Integral a => a -> a -> a negate :: forall a. Num a => a -> a not :: Bool -> Bool notElem :: - forall (t :: * -> *) a. (P.Foldable t, Eq a) => a -> t a -> Bool + forall (t :: * -> *) a. (Eq a, P.Foldable t) => a -> t a -> Bool null :: forall (t :: * -> *) a. P.Foldable t => t a -> Bool odd :: forall a. Integral a => a -> Bool or :: forall (t :: * -> *). P.Foldable t => t Bool -> Bool @@ -146,9 +146,9 @@ TYPE SIGNATURES pred :: forall a. Enum a => a -> a print :: forall a. Show a => a -> IO () product :: - forall (t :: * -> *) a. (P.Foldable t, Num a) => t a -> a + forall (t :: * -> *) a. (Num a, P.Foldable t) => t a -> a properFraction :: - forall b a. (RealFrac a, Integral b) => a -> (b, a) + forall b a. (Integral b, RealFrac a) => a -> (b, a) putChar :: Char -> IO () putStr :: String -> IO () putStrLn :: String -> IO () @@ -162,14 +162,14 @@ TYPE SIGNATURES readParen :: forall a. Bool -> ReadS a -> ReadS a reads :: forall a. Read a => ReadS a readsPrec :: forall a. Read a => Int -> ReadS a - realToFrac :: forall b a. (Real a, Fractional b) => a -> b + realToFrac :: forall b a. (Fractional b, Real a) => a -> b recip :: forall a. Fractional a => a -> a rem :: forall a. Integral a => a -> a -> a repeat :: forall a. a -> [a] replicate :: forall a. Int -> a -> [a] return :: forall (m :: * -> *) a. Monad m => a -> m a reverse :: forall a. [a] -> [a] - round :: forall b a. (RealFrac a, Integral b) => a -> b + round :: forall b a. (Integral b, RealFrac a) => a -> b scaleFloat :: forall a. RealFloat a => Int -> a -> a scanl :: forall a b. (b -> a -> b) -> b -> [a] -> [b] scanl1 :: forall a. (a -> a -> a) -> [a] -> [a] @@ -178,11 +178,11 @@ TYPE SIGNATURES seq :: forall b a. a -> b -> b sequence :: forall (t :: * -> *) (m :: * -> *) a. - (P.Traversable t, Monad m) => + (Monad m, P.Traversable t) => t (m a) -> m (t a) sequence_ :: forall (t :: * -> *) (m :: * -> *) a. - (P.Foldable t, Monad m) => + (Monad m, P.Foldable t) => t (m a) -> m () show :: forall a. Show a => a -> String showChar :: Char -> ShowS @@ -201,7 +201,7 @@ TYPE SIGNATURES sqrt :: forall a. Floating a => a -> a subtract :: forall a. Num a => a -> a -> a succ :: forall a. Enum a => a -> a - sum :: forall (t :: * -> *) a. (P.Foldable t, Num a) => t a -> a + sum :: forall (t :: * -> *) a. (Num a, P.Foldable t) => t a -> a tail :: forall a. [a] -> [a] take :: forall a. Int -> [a] -> [a] takeWhile :: forall a. (a -> Bool) -> [a] -> [a] @@ -210,7 +210,7 @@ TYPE SIGNATURES toEnum :: forall a. Enum a => Int -> a toInteger :: forall a. Integral a => a -> Integer toRational :: forall a. Real a => a -> Rational - truncate :: forall b a. (RealFrac a, Integral b) => a -> b + truncate :: forall b a. (Integral b, RealFrac a) => a -> b uncurry :: forall c b a. (a -> b -> c) -> (a, b) -> c undefined :: forall t. t unlines :: [String] -> String diff --git a/testsuite/tests/partial-sigs/should_compile/WarningWildcardInstantiations.stderr b/testsuite/tests/partial-sigs/should_compile/WarningWildcardInstantiations.stderr index b5268acb60..6d22293cb9 100644 --- a/testsuite/tests/partial-sigs/should_compile/WarningWildcardInstantiations.stderr +++ b/testsuite/tests/partial-sigs/should_compile/WarningWildcardInstantiations.stderr @@ -10,7 +10,7 @@ Dependent packages: [base-4.9.0.0, ghc-prim-0.5.0.0, WarningWildcardInstantiations.hs:5:14: warning: [-Wpartial-type-signatures (in -Wdefault)] • Found type wildcard ‘_a’ standing for ‘a’ Where: ‘a’ is a rigid type variable bound by - the inferred type of foo :: (Show a, Enum a) => a -> String + the inferred type of foo :: (Enum a, Show a) => a -> String at WarningWildcardInstantiations.hs:6:1 • In the type signature: foo :: (Show _a, _) => _a -> _ diff --git a/testsuite/tests/partial-sigs/should_fail/InstantiatedNamedWildcardsInConstraints.stderr b/testsuite/tests/partial-sigs/should_fail/InstantiatedNamedWildcardsInConstraints.stderr index 30efb8fc14..2df15443c9 100644 --- a/testsuite/tests/partial-sigs/should_fail/InstantiatedNamedWildcardsInConstraints.stderr +++ b/testsuite/tests/partial-sigs/should_fail/InstantiatedNamedWildcardsInConstraints.stderr @@ -2,7 +2,7 @@ InstantiatedNamedWildcardsInConstraints.hs:4:14: error: • Found type wildcard ‘_a’ standing for ‘b’ Where: ‘b’ is a rigid type variable bound by - the inferred type of foo :: (Show b, Enum b) => b -> (String, b) + the inferred type of foo :: (Enum b, Show b) => b -> (String, b) at InstantiatedNamedWildcardsInConstraints.hs:4:8 To use the inferred type, enable PartialTypeSignatures • In the type signature: diff --git a/testsuite/tests/partial-sigs/should_fail/WildcardInstantiations.stderr b/testsuite/tests/partial-sigs/should_fail/WildcardInstantiations.stderr index 63058a9781..7e0b5ace3e 100644 --- a/testsuite/tests/partial-sigs/should_fail/WildcardInstantiations.stderr +++ b/testsuite/tests/partial-sigs/should_fail/WildcardInstantiations.stderr @@ -2,7 +2,7 @@ WildcardInstantiations.hs:5:14: error: • Found type wildcard ‘_a’ standing for ‘a’ Where: ‘a’ is a rigid type variable bound by - the inferred type of foo :: (Show a, Enum a) => a -> String + the inferred type of foo :: (Enum a, Show a) => a -> String at WildcardInstantiations.hs:6:1 To use the inferred type, enable PartialTypeSignatures • In the type signature: diff --git a/testsuite/tests/rebindable/rebindable6.stderr b/testsuite/tests/rebindable/rebindable6.stderr index 8d2ea09928..8667f318bf 100644 --- a/testsuite/tests/rebindable/rebindable6.stderr +++ b/testsuite/tests/rebindable/rebindable6.stderr @@ -25,15 +25,18 @@ rebindable6.hs:110:17: error: return b } rebindable6.hs:111:17: error: - • Ambiguous type variable ‘t1’ arising from a do statement - with the failable pattern ‘Just (b :: b)’ - prevents the constraint ‘(HasFail - ([Prelude.Char] -> t1))’ from being solved. + • Ambiguous type variables ‘t0’, ‘t1’ arising from a do statement + prevents the constraint ‘(HasBind + (IO (Maybe b) -> (Maybe b -> t1) -> t0))’ from being solved. (maybe you haven't applied a function to enough arguments?) - Probable fix: use a type annotation to specify what ‘t1’ should be. + Relevant bindings include + g :: IO (Maybe b) (bound at rebindable6.hs:108:19) + test_do :: IO a -> IO (Maybe b) -> IO b + (bound at rebindable6.hs:108:9) + Probable fix: use a type annotation to specify what ‘t0’, ‘t1’ should be. These potential instance exist: - instance HasFail (String -> IO a) - -- Defined at rebindable6.hs:61:18 + instance HasBind (IO a -> (a -> IO b) -> IO b) + -- Defined at rebindable6.hs:51:18 • In a stmt of a 'do' block: Just (b :: b) <- g In the expression: do { f; diff --git a/testsuite/tests/typecheck/should_compile/T10971a.stderr b/testsuite/tests/typecheck/should_compile/T10971a.stderr index 72c675aa8c..bfcc3ff846 100644 --- a/testsuite/tests/typecheck/should_compile/T10971a.stderr +++ b/testsuite/tests/typecheck/should_compile/T10971a.stderr @@ -32,11 +32,11 @@ T10971a.hs:9:6: warning: [-Wname-shadowing (in -Wall)] This binding for ‘f’ shadows the existing binding defined at T10971a.hs:7:1 -T10971a.hs:9:31: warning: [-Wtype-defaults (in -Wall)] +T10971a.hs:9:14: warning: [-Wtype-defaults (in -Wall)] • Defaulting the following constraints to type ‘[]’ - (Foldable t0) arising from a use of ‘length’ at T10971a.hs:9:31-38 (Traversable t0) arising from a use of ‘fmapDefault’ at T10971a.hs:9:14-28 - • In the expression: length x + (Foldable t0) arising from a use of ‘length’ at T10971a.hs:9:31-38 + • In the expression: fmapDefault f x In the expression: (fmapDefault f x, length x) In the expression: \ f x -> (fmapDefault f x, length x) diff --git a/testsuite/tests/typecheck/should_fail/T5300.stderr b/testsuite/tests/typecheck/should_fail/T5300.stderr index f751249677..589da0a5c4 100644 --- a/testsuite/tests/typecheck/should_fail/T5300.stderr +++ b/testsuite/tests/typecheck/should_fail/T5300.stderr @@ -12,13 +12,13 @@ T5300.hs:11:7: error: f1 :: (Monad m, C1 a b c) => a -> StateT (T b) m a T5300.hs:14:7: error: - • Could not deduce (C2 a2 b2 c20) + • Could not deduce (C1 a1 b1 c10) from the context: (Monad m, C1 a1 b1 c1, C2 a2 b2 c2) bound by the type signature for: f2 :: (Monad m, C1 a1 b1 c1, C2 a2 b2 c2) => a1 -> StateT (T b2) m a2 at T5300.hs:14:7-69 - The type variable ‘c20’ is ambiguous + The type variable ‘c10’ is ambiguous • In the ambiguity check for ‘f2’ To defer the ambiguity check to use sites, enable AllowAmbiguousTypes In the type signature: diff --git a/testsuite/tests/typecheck/should_fail/T5853.stderr b/testsuite/tests/typecheck/should_fail/T5853.stderr index c95dc53d1c..62385ea1df 100644 --- a/testsuite/tests/typecheck/should_fail/T5853.stderr +++ b/testsuite/tests/typecheck/should_fail/T5853.stderr @@ -1,23 +1,22 @@ T5853.hs:15:46: error: - • Could not deduce: Subst t (Elem t2) ~ t2 + • Could not deduce: Subst (Subst t2 t) t1 ~ Subst t2 t1 arising from a use of ‘<$>’ - from the context: (F t1, - Elem t1 ~ Elem t1, + from the context: (F t2, Elem t2 ~ Elem t2, - Subst t1 (Elem t2) ~ t2, - Subst t2 (Elem t1) ~ t1, - F t, - Elem t ~ Elem t, - Elem t1 ~ Elem t1, - Subst t (Elem t1) ~ t1, - Subst t1 (Elem t) ~ t) + Elem (Subst t2 t1) ~ t1, + Subst t2 t1 ~ Subst t2 t1, + Subst (Subst t2 t1) (Elem t2) ~ t2, + F (Subst t2 t), + Elem (Subst t2 t) ~ t, + Elem t2 ~ Elem t2, + Subst (Subst t2 t) (Elem t2) ~ t2, + Subst t2 t ~ Subst t2 t) bound by the RULE "map/map" at T5853.hs:15:2-57 - ‘t2’ is a rigid type variable bound by - the RULE "map/map" at T5853.hs:15:2 + NB: ‘Subst’ is a type function, and may not be injective • In the expression: (f . g) <$> xs When checking the transformation rule "map/map" • Relevant bindings include - f :: Elem t1 -> Elem t2 (bound at T5853.hs:15:19) - g :: Elem t -> Elem t1 (bound at T5853.hs:15:21) - xs :: t (bound at T5853.hs:15:23) + f :: Elem t2 -> t1 (bound at T5853.hs:15:19) + g :: t -> Elem t2 (bound at T5853.hs:15:21) + xs :: Subst t2 t (bound at T5853.hs:15:23) diff --git a/testsuite/tests/typecheck/should_fail/tcfail171.stderr b/testsuite/tests/typecheck/should_fail/tcfail171.stderr index 4c1068b652..076a3394d4 100644 --- a/testsuite/tests/typecheck/should_fail/tcfail171.stderr +++ b/testsuite/tests/typecheck/should_fail/tcfail171.stderr @@ -1,8 +1,8 @@ tcfail171.hs:9:10: error: - • No instance for (PrintfType b) arising from a use of ‘printf’ + • No instance for (PrintfArg a) arising from a use of ‘printf’ Possible fix: - add (PrintfType b) to the context of + add (PrintfArg a) to the context of the type signature for: phex :: a -> b • In the expression: printf "0x%x" x diff --git a/testsuite/tests/typecheck/should_fail/tcfail204.stderr b/testsuite/tests/typecheck/should_fail/tcfail204.stderr index f3326faf0e..a3e8eec3d6 100644 --- a/testsuite/tests/typecheck/should_fail/tcfail204.stderr +++ b/testsuite/tests/typecheck/should_fail/tcfail204.stderr @@ -1,12 +1,11 @@ -tcfail204.hs:10:15: warning: [-Wtype-defaults (in -Wall)] +tcfail204.hs:10:7: warning: [-Wtype-defaults (in -Wall)] • Defaulting the following constraints to type ‘Double’ - (Fractional a0) - arising from the literal ‘6.3’ at tcfail204.hs:10:15-17 (RealFrac a0) arising from a use of ‘ceiling’ at tcfail204.hs:10:7-17 - • In the first argument of ‘ceiling’, namely ‘6.3’ - In the expression: ceiling 6.3 + (Fractional a0) + arising from the literal ‘6.3’ at tcfail204.hs:10:15-17 + • In the expression: ceiling 6.3 In an equation for ‘foo’: foo = ceiling 6.3 <no location info>: error: diff --git a/testsuite/tests/warnings/should_compile/PluralS.stderr b/testsuite/tests/warnings/should_compile/PluralS.stderr index 4cffc15a1f..b1ceab6762 100644 --- a/testsuite/tests/warnings/should_compile/PluralS.stderr +++ b/testsuite/tests/warnings/should_compile/PluralS.stderr @@ -6,12 +6,11 @@ PluralS.hs:15:17: warning: [-Wtype-defaults (in -Wall)] In the expression: 123 `seq` () In an equation for ‘defaultingNum’: defaultingNum = 123 `seq` () -PluralS.hs:17:29: warning: [-Wtype-defaults (in -Wall)] +PluralS.hs:17:24: warning: [-Wtype-defaults (in -Wall)] • Defaulting the following constraints to type ‘Integer’ - (Num a0) arising from the literal ‘123’ at PluralS.hs:17:29-31 (Show a0) arising from a use of ‘show’ at PluralS.hs:17:24-31 - • In the first argument of ‘show’, namely ‘123’ - In the expression: show 123 + (Num a0) arising from the literal ‘123’ at PluralS.hs:17:29-31 + • In the expression: show 123 In an equation for ‘defaultingNumAndShow’: defaultingNumAndShow = show 123 |