Skip to content
Snippets Groups Projects
Commit cedd20d4 authored by Simon Peyton Jones's avatar Simon Peyton Jones
Browse files

[project @ 1999-02-10 15:45:52 by simonpj]

Misc tests fixes, and activate the programs directory
parent 24bcd8b0
No related merge requests found
rnfail014.hs:9:
The constraint `Eq a' does not mention any of
the universally quantified type variables {}
of the type `Eq Bool'
In the type signature for an instance decl
rnfail014.hs:9:
The constraint `Eq a'
mentions type variables that do not appear in the type
`Eq Bool'
In the type signature for an instance decl
rnfail014.hs:12:
The constraint `Eq a' does not mention any of
the universally quantified type variables {}
of the type `Int -> Int'
In the type signature for `f'
rnfail014.hs:12:
The constraint `Eq a'
mentions type variables that do not appear in the type
`Int -> Int'
In the type signature for `f'
rnfail014.hs:17:
The constraint `Eq a' does not mention any of
the universally quantified type variables {}
......
rnfail015.hs:9:
Conflicting definitions for `TokLiteral' in the data type declaration for Token
Conflicting definitions for `TokLiteral'
in the data type declaration for `Token'
Compilation had errors
......
ghc: module version changed to 1; reason: no old .hi file
__export ShouldSucceed area2 Point2{Point2};
__export ShouldSucceed Point2{Point2} area2;
......@@ -3,8 +3,8 @@ module ShouldSucceed where
import PrelGHC -- to get at All
data Monad2 m = MkMonad2 (All a => a -> m a)
((All a, All b) => m a -> (a -> m b) -> m b)
data Monad2 m = MkMonad2 (forall a. a -> m a)
(forall a b. m a -> (a -> m b) -> m b)
halfListMonad :: ((All a, All b) => [a] -> (a -> [b]) -> [b]) -> Monad2 []
halfListMonad :: (forall a b. [a] -> (a -> [b]) -> [b]) -> Monad2 []
halfListMonad b = MkMonad2 (\x -> [x]) b
ghc: module version changed to 1; reason: no old .hi file
_exports_
ShouldSucceed halfListMonad Monad2(MkMonad2);
_instances_
instance _forall_ [a :: (* -> *)] => {PrelBase.Eval (Monad2 a)} = $dEvalMonad20;
_declarations_
1 $dEvalMonad20 _:_ _forall_ [a :: (* -> *)] => {PrelBase.Eval (Monad2 a)} ;;
1 data Monad2 m :: (* -> *) = MkMonad2 (_forall_ [a] => a -> m a) (_forall_ [a b] => m a -> (a -> m b) -> m b) ;
1 halfListMonad _:_ (_forall_ [a b] => [a] -> (a -> [b]) -> [b]) -> Monad2 PrelBase.[] ;;
__export ShouldSucceed Monad2{MkMonad2} halfListMonad;
1 data Monad2 m :: (* -> *) = MkMonad2 (__forall [a] => a -> m a) (__forall [a b] => m a -> (a -> m b) -> m b) ;
1 halfListMonad :: (__forall [a b] => [a] -> (a -> [b]) -> [b]) -> Monad2 PrelBase.ZMZN ;
......@@ -6,7 +6,6 @@ data NUM = ONE | TWO
class EQ a where
(==) :: a -> a -> Bool
instance EQ NUM
-- a /= b = False
-- a == b = True
-- a /= b = False
instance EQ NUM where
a /= b = False
a == b = True
tcfail039.hs:7:
tcfail039.hs:11:
Ambiguous occurrence `=='
It could refer to: ==: defined at tcfail039.hs:7
PrelBase.==: imported from Prelude at tcfail039.hs:3
It could refer to either `==', defined at tcfail039.hs:7
or `Prelude.==', imported from Prelude at tcfail039.hs:3
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