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

[project @ 1999-06-14 09:29:01 by simonpj]

Accept some test changes; add tcfail082, read021
parent 1a32582e
No related merge requests found
Showing
with 86 additions and 40 deletions
cc004.hs:2:
Cannot generalise these overloadings (in a _ccall_):
`CReturnable b' arising from the result of the _ccall_ to `f' at cc004.hs:15
`CReturnable b' arising from the result of the _ccall_ to `f' at cc004.hs:8
cc004.hs:2:
Cannot generalise these overloadings (in a _ccall_):
`CReturnable b' arising from the result of the _ccall_ to `f' at cc004.hs:8
`CReturnable b' arising from the result of the _ccall_ to `f' at cc004.hs:15
Compilation had errors
!! N-plus-K pattern in binding
-- From: Andreas Marth
-- Sent: Monday, June 07, 1999 5:02 PM
-- To: glasgow-haskell-bugs@majordomo.haskell.org
-- Subject: compiler-bug
module Test where
erroR :: Int
erroR = n where
(n+1,_) = (5,2)
-- Produced a -dcore-lint error in the desugarer output
-- (Was a missing case in DsHsSyn.collectTypedPatBinders)
......@@ -5,22 +5,22 @@ read014.hs:4: Warning: Defined but not used: x
read014.hs:8: Warning: Defined but not used: x
read014.hs:8:
Warning: No explicit method nor default method for `fromInteger'
read014.hs:6:
Warning: No explicit method nor default method for `+'
in an instance declaration for `Num'
read014.hs:8:
Warning: No explicit method nor default method for `signum'
read014.hs:6:
Warning: No explicit method nor default method for `*'
in an instance declaration for `Num'
read014.hs:8:
read014.hs:6:
Warning: No explicit method nor default method for `abs'
in an instance declaration for `Num'
read014.hs:8:
Warning: No explicit method nor default method for `*'
read014.hs:6:
Warning: No explicit method nor default method for `signum'
in an instance declaration for `Num'
read014.hs:8:
Warning: No explicit method nor default method for `+'
read014.hs:6:
Warning: No explicit method nor default method for `fromInteger'
in an instance declaration for `Num'
-- !!! Empty export list
module Reader() where
instance Show (a->b) where
show f = "<<function>>"
read004.hs:19:1: Illegal character: `.' in a string gap
read004.hs:19:1: on input: "."
read004.hs:14: error in character literal
Compilation had errors
......@@ -5,5 +5,5 @@ instance {K PrelBase.Bool} = _f2;
instance __forall [a] => {K [a]} = _f3;
1 _f1 :: {K PrelBase.Int} ;
1 _f2 :: {K PrelBase.Bool} ;
1 _f3 :: __forall [a] => {K PrelList.[a]} ;
1 _f3 :: __forall [a] => {K [a]} ;
1 class K a :: (* -> *) where { op1 :: a -> a ; op2 :: a -> a } ;
rnfail004.hs:6:
rnfail004.hs:7:
Conflicting definitions for `a'
in a binding group
rnfail004.hs:7:
rnfail004.hs:8:
Conflicting definitions for `b'
in a binding group
......
rnfail012.hs:2:
Multiple declarations of `A'
defined at rnfail012.hs:3
defined at rnfail012.hs:9
defined at rnfail012.hs:2
defined at rnfail012.hs:8
Compilation had errors
rnfail013.hs:3:
Multiple declarations of `MkT'
defined at rnfail013.hs:5
defined at rnfail013.hs:7
defined at rnfail013.hs:9
Compilation had errors
rnfail014.hs:9:
rnfail014.hs:8:
None of the type variable(s) in the constraint `Eq a'
appears in the type `Eq Bool'
In the type signature for an instance decl
......
rnfail015.hs:9:
rnfail015.hs:8:
Conflicting definitions for `TokLiteral'
in the data type declaration for `Token'
......
module Data82 where
data FooData = FooData
......@@ -14,21 +14,21 @@ Digraph.hs:19:
([], [])
(snd (dfs (new_range es) ([], []) vs)))
where
span_tree r (vs, ns) [] = (vs, ns)
span_tree r (vs, ns) (x : xs)
| x `elem` vs = span_tree r (vs, ns) xs
| otherwise = span_tree r (vs', (x : ns') : ns) xs
where
(vs', ns') = dfs r (x : vs, []) (r x)
swap (x, y) = (y, x)
reversed_edges :: forall v. (Eq v) => [Edge v]
reversed_edges = map swap es
new_range [] w = []
new_range ((x, y) : xys) w
= if x == w then
(y : (new_range xys w))
else
(new_range xys w)
swap (x, y) = (y, x)
reversed_edges :: forall v. (Eq v) => [Edge v]
reversed_edges = map swap es
span_tree r (vs, ns) [] = (vs, ns)
span_tree r (vs, ns) (x : xs)
| x `elem` vs = span_tree r (vs, ns) xs
| otherwise = span_tree r (vs', (x : ns') : ns) xs
where
(vs', ns') = dfs r (x : vs, []) (r x)
Compilation had errors
module Inst82_1 where
import Data82
instance Read FooData where
readsPrec _ _ = [(FooData,"")]
module Inst82_2 where
import Data82
instance Read FooData where
readsPrec _ _ = [(FooData,"")]
......@@ -2,12 +2,22 @@ TOP = ../..
include $(TOP)/mk/boilerplate.mk
include $(TOP)/mk/should_fail.mk
SRC_HC_OPTS += -noC
HS_SRCS = $(wildcard *.hs)
# The -noC messes up the Data82 compilation
# SRC_HC_OPTS += -noC
tcfail045_HC_OPTS = -fglasgow-exts
tcfail068_HC_OPTS = -fglasgow-exts
tcfail080_HC_OPTS = -fglasgow-exts
Inst82_1.o : Inst82_1.hs Data82.hi
$(HC) $(HC_OPTS) -c $< -o $@
Inst82_2.o : Inst82_2.hs Data82.hi
$(HC) $(HC_OPTS) -c $< -o $@
Data82.o : Data82.hs
$(HC) $(HC_OPTS) -c $< -o $@
# mkdependHS doesn't understand OPTIONS pragmas...
SRC_MKDEPENDHS_OPTS += -fglasgow-exts
......
tcfail001.hs:9:
tcfail001.hs:8:
Warning: Duplicate class assertion `A a' in the context:
(A a, A a) => ...
......
tcfail017.hs:11:
tcfail017.hs:10:
Could not deduce `C [a]'
(arising from an instance declaration at tcfail017.hs:11)
(arising from an instance declaration at tcfail017.hs:10)
from the context: (B a)
Probable cause: missing `C [a]' in instance declaration context
or missing instance declaration for `C [a]'
......
tcfail019.hs:19:
tcfail019.hs:18:
Could not deduce `C [a]'
(arising from an instance declaration at tcfail019.hs:19)
(arising from an instance declaration at tcfail019.hs:18)
from the context: ()
Probable cause: missing `C [a]' in instance declaration context
or missing instance declaration for `C [a]'
When checking the superclasses of an instance declaration
tcfail019.hs:19:
tcfail019.hs:18:
Could not deduce `B [a]'
(arising from an instance declaration at tcfail019.hs:19)
(arising from an instance declaration at tcfail019.hs:18)
from the context: ()
Probable cause: missing `B [a]' in instance declaration context
or missing instance declaration for `B [a]'
......
tcfail020.hs:11:
tcfail020.hs:10:
Could not deduce `A [a]'
(arising from an instance declaration at tcfail020.hs:11)
(arising from an instance declaration at tcfail020.hs:10)
from the context: (A a)
Probable cause: missing `A [a]' in instance declaration context
or missing instance declaration for `A [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