[commit: ghc] master: Testsuite: delete Windows line endings [skip ci] (#11631) (31c312e)
git at git.haskell.org
git at git.haskell.org
Tue Feb 23 11:27:04 UTC 2016
Repository : ssh://git@git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/31c312ebd29a4e79c166ad5dbbd5b57b42b6fafa/ghc
>---------------------------------------------------------------
commit 31c312ebd29a4e79c166ad5dbbd5b57b42b6fafa
Author: Thomas Miedema <thomasmiedema at gmail.com>
Date: Mon Feb 22 21:31:24 2016 +0100
Testsuite: delete Windows line endings [skip ci] (#11631)
>---------------------------------------------------------------
31c312ebd29a4e79c166ad5dbbd5b57b42b6fafa
testsuite/tests/typecheck/should_run/T1735.hs | 0
testsuite/tests/typecheck/should_run/T1735_Help/Basics.hs | 0
testsuite/tests/typecheck/should_run/T1735_Help/Context.hs | 0
testsuite/tests/typecheck/should_run/T1735_Help/Instances.hs | 0
testsuite/tests/typecheck/should_run/T1735_Help/Main.hs | 0
testsuite/tests/typecheck/should_run/T1735_Help/State.hs | 0
testsuite/tests/typecheck/should_run/T1735_Help/Xml.hs | 0
testsuite/tests/typecheck/should_run/T4809_XMLGenerator.hs | 0
testsuite/tests/typecheck/should_run/TcRun038_B.hs | 0
testsuite/tests/typecheck/should_run/tcrun032.hs | 4 ++--
testsuite/tests/typecheck/should_run/tcrun038.hs | 0
testsuite/tests/typecheck/should_run/tcrun039.hs | 2 +-
12 files changed, 3 insertions(+), 3 deletions(-)
diff --git a/testsuite/tests/typecheck/should_run/tcrun032.hs b/testsuite/tests/typecheck/should_run/tcrun032.hs
index 8aa4363..5609a9f 100644
--- a/testsuite/tests/typecheck/should_run/tcrun032.hs
+++ b/testsuite/tests/typecheck/should_run/tcrun032.hs
@@ -8,7 +8,7 @@ module Main where
data Fix f = In (f (Fix f))
instance Show (f (Fix f)) => Show (Fix f) where
- show (In x) = "In " ++ show x -- No parens, but never mind
+ show (In x) = "In " ++ show x -- No parens, but never mind
instance Eq (f (Fix f)) => Eq (Fix f) where
(In x) == (In y) = x==y
@@ -16,5 +16,5 @@ instance Eq (f (Fix f)) => Eq (Fix f) where
data L x = Nil | Cons Int x deriving( Show, Eq )
main = do { print (In Nil);
- print (In Nil == In Nil) }
+ print (In Nil == In Nil) }
diff --git a/testsuite/tests/typecheck/should_run/tcrun039.hs b/testsuite/tests/typecheck/should_run/tcrun039.hs
index 916d533..eabe015 100644
--- a/testsuite/tests/typecheck/should_run/tcrun039.hs
+++ b/testsuite/tests/typecheck/should_run/tcrun039.hs
@@ -16,7 +16,7 @@ data GADT a where
g :: forall b. Read b => GADT b -> String -> b
g (MkG n) s = -- Here we know Read [b]
- n : (read s)
+ n : (read s)
main = do print (f (MkT (3::Int)) "4")
print (g (MkG (3::Int)) "[4,5]")
More information about the ghc-commits
mailing list