summaryrefslogtreecommitdiff
path: root/testsuite/tests/rename
diff options
context:
space:
mode:
Diffstat (limited to 'testsuite/tests/rename')
-rw-r--r--testsuite/tests/rename/prog001/rn037.hs4
-rw-r--r--testsuite/tests/rename/prog002/rnfail037.hs4
-rw-r--r--testsuite/tests/rename/prog005/View.hs10
-rw-r--r--testsuite/tests/rename/should_compile/RnAux017.hs4
-rw-r--r--testsuite/tests/rename/should_compile/T3221.hs2
-rw-r--r--testsuite/tests/rename/should_compile/rn029.hs10
-rw-r--r--testsuite/tests/rename/should_compile/rn041.hs6
-rw-r--r--testsuite/tests/rename/should_compile/rn043.hs4
-rw-r--r--testsuite/tests/rename/should_compile/rn049.hs5
-rw-r--r--testsuite/tests/rename/should_compile/timing001.hs2
-rw-r--r--testsuite/tests/rename/should_fail/rnfail002.hs2
-rw-r--r--testsuite/tests/rename/should_fail/rnfail004.hs6
-rw-r--r--testsuite/tests/rename/should_fail/rnfail008.hs18
-rw-r--r--testsuite/tests/rename/should_fail/rnfail015.hs2
-rw-r--r--testsuite/tests/rename/should_fail/rnfail017.hs14
-rw-r--r--testsuite/tests/rename/should_fail/rnfail020.hs2
-rw-r--r--testsuite/tests/rename/should_fail/rnfail023.hs6
17 files changed, 50 insertions, 51 deletions
diff --git a/testsuite/tests/rename/prog001/rn037.hs b/testsuite/tests/rename/prog001/rn037.hs
index 544de2fdd9..23a4cfa4b9 100644
--- a/testsuite/tests/rename/prog001/rn037.hs
+++ b/testsuite/tests/rename/prog001/rn037.hs
@@ -2,8 +2,8 @@
module ShouldCompile where
import Rn037Help hiding( C )
- -- C is the constructor, but we should
- -- still be able to hide it
+ -- C is the constructor, but we should
+ -- still be able to hide it
-- we should still be able to refer to the type constructor, though
type Foo = T
diff --git a/testsuite/tests/rename/prog002/rnfail037.hs b/testsuite/tests/rename/prog002/rnfail037.hs
index 0a2935c5ad..6eaa1da34b 100644
--- a/testsuite/tests/rename/prog002/rnfail037.hs
+++ b/testsuite/tests/rename/prog002/rnfail037.hs
@@ -2,7 +2,7 @@
module ShouldCompile where
import Rn037Help hiding( C )
- -- C is the constructor, but we should
- -- still be able to hide it
+ -- C is the constructor, but we should
+ -- still be able to hide it
f x = Rn037Help.C
diff --git a/testsuite/tests/rename/prog005/View.hs b/testsuite/tests/rename/prog005/View.hs
index c14d301c3d..4bb2f66b2d 100644
--- a/testsuite/tests/rename/prog005/View.hs
+++ b/testsuite/tests/rename/prog005/View.hs
@@ -11,8 +11,8 @@ Compiling VersionGraphClient ( ./VersionGraphClient.hs, ./VersionGraphClient.o )
View.hs:14:
Couldn't match `VersionGraphClient' against `VersionGraphClient'
- Expected type: VersionGraphClient
- Inferred type: VersionGraphClient
+ Expected type: VersionGraphClient
+ Inferred type: VersionGraphClient
In the `graphClient1' field of a record
In the record construction: View {graphClient1 = graphClient}
@@ -23,9 +23,9 @@ However ghc without make has no problems.
# ghc -c View.hs
-}
--- | This module defines the fundamental structure of the (untyped)
--- objects in a repository.
---
+-- | This module defines the fundamental structure of the (untyped)
+-- objects in a repository.
+--
-- We depend circularly on CodedValue.hs. This module is compiled
-- first and uses CodedValue.hi-boot.
module View(
diff --git a/testsuite/tests/rename/should_compile/RnAux017.hs b/testsuite/tests/rename/should_compile/RnAux017.hs
index 5514524fee..5eb076ddd1 100644
--- a/testsuite/tests/rename/should_compile/RnAux017.hs
+++ b/testsuite/tests/rename/should_compile/RnAux017.hs
@@ -1,6 +1,6 @@
module RnAux017 where
-import Test -- Import main module so there really is a loop
- -- (avoid warning message)
+import Test -- Import main module so there really is a loop
+ -- (avoid warning message)
data Wibble = Wibble
data Wobble = Wobble
diff --git a/testsuite/tests/rename/should_compile/T3221.hs b/testsuite/tests/rename/should_compile/T3221.hs
index 5550fd3fa7..970abfb403 100644
--- a/testsuite/tests/rename/should_compile/T3221.hs
+++ b/testsuite/tests/rename/should_compile/T3221.hs
@@ -1,7 +1,7 @@
{-# OPTIONS_GHC -Werror -fwarn-unused-binds #-}
-- Test Trac #3221: the constructors are used by the deriving
--- clause, even though they are not exported
+-- clause, even though they are not exported
module T3221( Foo ) where
diff --git a/testsuite/tests/rename/should_compile/rn029.hs b/testsuite/tests/rename/should_compile/rn029.hs
index 76dd993dc9..20439d2ab6 100644
--- a/testsuite/tests/rename/should_compile/rn029.hs
+++ b/testsuite/tests/rename/should_compile/rn029.hs
@@ -3,12 +3,12 @@ module ShouldCompile where
import Data.List ( reverse, sort )
-sort :: Int -- Clashes with Data.List.sort,
-sort = 4 -- but never used, so OK
-
+sort :: Int -- Clashes with Data.List.sort,
+sort = 4 -- but never used, so OK
-reverse :: Int -- Clashes with Data.List.reverse,
-reverse = 3 -- but the only uses are qualified
+
+reverse :: Int -- Clashes with Data.List.reverse,
+reverse = 3 -- but the only uses are qualified
x = ShouldCompile.reverse
diff --git a/testsuite/tests/rename/should_compile/rn041.hs b/testsuite/tests/rename/should_compile/rn041.hs
index 454227c14d..1606e537ce 100644
--- a/testsuite/tests/rename/should_compile/rn041.hs
+++ b/testsuite/tests/rename/should_compile/rn041.hs
@@ -4,10 +4,10 @@
module ShouldCompile( t ) where
-f x = f x -- Unused
+f x = f x -- Unused
-g x = h x -- Unused
+g x = h x -- Unused
h x = g x
-t x = t x -- Used by export list
+t x = t x -- Used by export list
diff --git a/testsuite/tests/rename/should_compile/rn043.hs b/testsuite/tests/rename/should_compile/rn043.hs
index e88e8426df..e1b01135f9 100644
--- a/testsuite/tests/rename/should_compile/rn043.hs
+++ b/testsuite/tests/rename/should_compile/rn043.hs
@@ -2,5 +2,5 @@
module ShouldCompile (module M) where
- import Rn043_A as M -- x, M.x
- import Rn043_B -- x, Rn043_A.x
+ import Rn043_A as M -- x, M.x
+ import Rn043_B -- x, Rn043_A.x
diff --git a/testsuite/tests/rename/should_compile/rn049.hs b/testsuite/tests/rename/should_compile/rn049.hs
index 83f6c5c276..82c78b7742 100644
--- a/testsuite/tests/rename/should_compile/rn049.hs
+++ b/testsuite/tests/rename/should_compile/rn049.hs
@@ -1,7 +1,7 @@
-- GHC 6.4.1 said
-- test.hs:1:5:
--- Warning: accepting non-standard pattern guards
--- (-fglasgow-exts to suppress this message)
+-- Warning: accepting non-standard pattern guards
+-- (-fglasgow-exts to suppress this message)
-- [x <- ((1 * 2) + 3) * 4, undefined]
-- Note the wrongly-parenthesised expression
@@ -10,4 +10,3 @@
module ShouldCompile where
main | x <- 1*2+3*4 = x
- \ No newline at end of file
diff --git a/testsuite/tests/rename/should_compile/timing001.hs b/testsuite/tests/rename/should_compile/timing001.hs
index b84b341f19..af4d9cc147 100644
--- a/testsuite/tests/rename/should_compile/timing001.hs
+++ b/testsuite/tests/rename/should_compile/timing001.hs
@@ -504,4 +504,4 @@ a495 = a496
a496 = a497
a497 = a498
a498 = a499
-a499 = [] -- !!! ta-dah!!!
+a499 = [] -- !!! ta-dah!!!
diff --git a/testsuite/tests/rename/should_fail/rnfail002.hs b/testsuite/tests/rename/should_fail/rnfail002.hs
index ab387223fc..bb65762d45 100644
--- a/testsuite/tests/rename/should_fail/rnfail002.hs
+++ b/testsuite/tests/rename/should_fail/rnfail002.hs
@@ -1,5 +1,5 @@
-- !!! rn001: super-simple set of bindings,
--- !!! incl wildcard pattern-bindings and *duplicates*
+-- !!! incl wildcard pattern-bindings and *duplicates*
x = []
y = []
diff --git a/testsuite/tests/rename/should_fail/rnfail004.hs b/testsuite/tests/rename/should_fail/rnfail004.hs
index 90a97f894c..f8f01ee6ff 100644
--- a/testsuite/tests/rename/should_fail/rnfail004.hs
+++ b/testsuite/tests/rename/should_fail/rnfail004.hs
@@ -3,6 +3,6 @@ module Foo where
f x = x
where
- a = []
- (b,c,a) = ([],[],d)
- [d,b,_] = ([],a,[])
+ a = []
+ (b,c,a) = ([],[],d)
+ [d,b,_] = ([],a,[])
diff --git a/testsuite/tests/rename/should_fail/rnfail008.hs b/testsuite/tests/rename/should_fail/rnfail008.hs
index 196214a840..f63fab5cdf 100644
--- a/testsuite/tests/rename/should_fail/rnfail008.hs
+++ b/testsuite/tests/rename/should_fail/rnfail008.hs
@@ -3,17 +3,17 @@
module Test where
class K a where
- op1 :: a -> a -> a
- op2 :: Int -> a
+ op1 :: a -> a -> a
+ op2 :: Int -> a
instance K Int where
- op1 a b = a+b
- op2 x = x
+ op1 a b = a+b
+ op2 x = x
instance K Bool where
- op1 a b = a
- -- Pick up the default decl for op2
-
+ op1 a b = a
+ -- Pick up the default decl for op2
+
instance K [a] where
- op3 a = a -- Oops! Isn't a class op of K
-
+ op3 a = a -- Oops! Isn't a class op of K
+
diff --git a/testsuite/tests/rename/should_fail/rnfail015.hs b/testsuite/tests/rename/should_fail/rnfail015.hs
index 20f9934f4b..1f20a7efb2 100644
--- a/testsuite/tests/rename/should_fail/rnfail015.hs
+++ b/testsuite/tests/rename/should_fail/rnfail015.hs
@@ -11,7 +11,7 @@ data Token
| TokIs
| TokDeref
| TokFind
- | TokLiteral -- Duplicated!
+ | TokLiteral -- Duplicated!
| TokThe
deriving Show
diff --git a/testsuite/tests/rename/should_fail/rnfail017.hs b/testsuite/tests/rename/should_fail/rnfail017.hs
index 327a9d6abd..9090e23e3f 100644
--- a/testsuite/tests/rename/should_fail/rnfail017.hs
+++ b/testsuite/tests/rename/should_fail/rnfail017.hs
@@ -2,16 +2,16 @@ module ShouldFail where
-- !!! Precedence of unary negation
-f1 x y = x + -y -- Fails
-f2 x y = x * -y -- Fails
+f1 x y = x + -y -- Fails
+f2 x y = x * -y -- Fails
-f3 x y = -x + y -- OK: means (-x) + y
- -- since - is left associative
+f3 x y = -x + y -- OK: means (-x) + y
+ -- since - is left associative
-f4 x y = - x*y -- OK: means -(x*y)
- -- since - binds less tightly than *
+f4 x y = - x*y -- OK: means -(x*y)
+ -- since - binds less tightly than *
-f5 x y = x >= -y -- OK means x >= (-y)
+f5 x y = x >= -y -- OK means x >= (-y)
diff --git a/testsuite/tests/rename/should_fail/rnfail020.hs b/testsuite/tests/rename/should_fail/rnfail020.hs
index c6efc4d5f7..c76f8924ef 100644
--- a/testsuite/tests/rename/should_fail/rnfail020.hs
+++ b/testsuite/tests/rename/should_fail/rnfail020.hs
@@ -17,6 +17,6 @@ unionSetB (s1 :: Set a) s2 = unionSets s1 s2
{- In GHC 4.04 this gave the terrible message:
None of the type variable(s) in the constraint `Eq a'
- appears in the type `Set a -> Set a -> Set a'
+ appears in the type `Set a -> Set a -> Set a'
In the type signature for `unionSets'
-}
diff --git a/testsuite/tests/rename/should_fail/rnfail023.hs b/testsuite/tests/rename/should_fail/rnfail023.hs
index bf7c4a2f20..07f804b731 100644
--- a/testsuite/tests/rename/should_fail/rnfail023.hs
+++ b/testsuite/tests/rename/should_fail/rnfail023.hs
@@ -1,4 +1,4 @@
--- !!! Check that type signatures and pragmas that
+-- !!! Check that type signatures and pragmas that
-- !!! don't have a "parent" are correctly reported
module ShouldFail where
@@ -8,8 +8,8 @@ f :: Int -> Int
{-# INLINE f #-}
-- Nested test
-h :: Int -> Int -- This one is ok
+h :: Int -> Int -- This one is ok
h x = x
where
- g :: Int -> Int -- Bogus
+ g :: Int -> Int -- Bogus