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

[project @ 2000-11-03 16:23:37 by simonmar]

"make clean" in here now works as advertised.
parent 4816dbe2
No related merge requests found
Showing
with 19 additions and 19 deletions
-- !!! Checking that more than imported module can share a local
-- !!! local alias.
module ShouldSucceed where
module ShouldCompile where
import qualified List as X
import qualified Maybe as X
......
-- !!! Checking that an imported module may still have
-- !!! a local alias without having used 'qualified'.
module ShouldSucceed where
module ShouldCompile where
import List as X
import Maybe as X
......
-- !!! Checking that a toplevel declaration 'f' in module M is accessible
-- !!! as both 'f' and 'M.f' within the scope of M. Similarly for imported
-- !!! entities.
module ShouldSucceed where
module ShouldCompile where
import List ( sort )
......@@ -12,7 +12,7 @@ y :: Int
y = x
z :: Int
z = ShouldSucceed.x
z = ShouldCompile.x
sortOf :: Ord a=> [a] -> [a]
sortOf = List.sort
-- !!! Checking that lazy name clashing works.
module ShouldSucceed where
module ShouldCompile where
import List ( reverse, sort )
......@@ -10,7 +10,7 @@ sort = 4 -- but never used, so OK
reverse :: Int -- Clashes with List.reverse,
reverse = 3 -- but the only uses are qualified
x = ShouldSucceed.reverse
x = ShouldCompile.reverse
y = List.reverse
......
-- !!! Checking that more than imported module can share a local
-- !!! local alias.
module ShouldSucceed where
module ShouldCompile where
import qualified List as X
import qualified Maybe as X
......
-- !!! Checking that an imported module may still have
-- !!! a local alias without having used 'qualified'.
module ShouldSucceed where
module ShouldCompile where
import List as X
import Maybe as X
......
-- !!! Checking that a toplevel declaration 'f' in module M is accessible
-- !!! as both 'f' and 'M.f' within the scope of M. Similarly for imported
-- !!! entities.
module ShouldSucceed where
module ShouldCompile where
import List ( sort )
......@@ -12,7 +12,7 @@ y :: Int
y = x
z :: Int
z = ShouldSucceed.x
z = ShouldCompile.x
sortOf :: Ord a=> [a] -> [a]
sortOf = List.sort
-- !!! Checking that lazy name clashing works
module ShouldSucceed where
module ShouldCompile where
import List ( sort )
......@@ -7,7 +7,7 @@ sort :: Int
sort = 3
foo :: Int
foo = ShouldSucceed.sort
foo = ShouldCompile.sort
baz :: (Ord a) => [a] -> [a]
baz = List.sort
......
-- !!! Checking that empty declarations are permitted.
module ShouldSucceed where
module ShouldCompile where
class Foo a where
......
-- !!! Checking what's legal in the body of a class declaration.
module ShouldSucceed where
module ShouldCompile where
class Foo a where {
(--<>--) :: a -> a -> Int ;
......
-- !!! Checking that qualified method names are legal in instance body.
module ShouldSucceed where
module ShouldCompile where
import Prelude hiding (Eq, (==))
import Prelude as P (Eq,(==))
......
-- !!! Checking that you can hide a constructor
module ShouldSucceed where
module ShouldCompile where
import Rn037Help hiding( C )
-- C is the constructor, but we should
......
......@@ -3,7 +3,7 @@
-- only tickled by the simplifier
-- type Foo a b = a -> (b -> a) -> b
module Test where
module ShouldCompile where
(++++) :: (a -> (b -> a) -> b) -> (a -> (b -> a) -> b) -> a -> (b -> a) -> b
x ++++ y = y
......
-- !!! class/instance mumble that failed Lint at one time
--
module Test where
module ShouldCompile where
class Foo a where
op :: Int -> a -> Bool
......
......@@ -5,7 +5,7 @@ From: Julian Seward (DRL PhD) <sewardj@computer-science.manchester.ac.uk>
Message-Id: <9412081138.AA16652@rdf009.cs.man.ac.uk>
To: partain@dcs.gla.ac.uk
-}
module ShouldFail where
module ShouldCompile where
type IMonad a
= IMonadState -> IMonadReturn a
......
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