Skip to content
Snippets Groups Projects
Commit b1467fdc authored by Simon Marlow's avatar Simon Marlow
Browse files

[project @ 1999-06-11 16:10:18 by simonmar]

- add a test for non-parsing of strict newtype constructor fields
- other small fixes
parent ad240f4e
No related merge requests found
......@@ -10,3 +10,6 @@ x = 2 where
y = 3
instance Foo Int where
f = f where g = g where
type T = Int
module ShouldFail where
{-
From: Kevin Hammond <kh>
To: partain
......@@ -8,7 +10,7 @@ OK, I've fixed that little problem by disallowing,
-}
module Test where
f x = x + if c then 1 else 2
f x = x + if True then 1 else 2
f x = x + 1::Int
-- (the conditional/sig need to be parenthesised). If this is
......
module ShouldFail where
-- strictness annotations on the argument to a newtype constructor
-- are not allowed.
newtype N a = T ![a]
read008.hs:5: parse error on input `!'
Compilation had errors
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