[commit: ghc] master: `M-x delete-trailing-whitespace` & `M-x untabify` (805ee11)

git at git.haskell.org git at git.haskell.org
Wed Sep 24 21:44:27 UTC 2014


Repository : ssh://git@git.haskell.org/ghc

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/805ee118b823f271dfd8036d35b15eb3454a95ad/ghc

>---------------------------------------------------------------

commit 805ee118b823f271dfd8036d35b15eb3454a95ad
Author: Herbert Valerio Riedel <hvr at gnu.org>
Date:   Wed Sep 24 23:42:55 2014 +0200

    `M-x delete-trailing-whitespace` & `M-x untabify`
    
    ...several modules in `base` recently touched by me


>---------------------------------------------------------------

805ee118b823f271dfd8036d35b15eb3454a95ad
 libraries/base/Control/Exception/Base.hs          | 2 +-
 libraries/base/Control/Monad.hs                   | 0
 libraries/base/Control/Monad/Fix.hs               | 0
 libraries/base/Data/Data.hs                       | 0
 libraries/base/Data/Foldable.hs                   | 0
 libraries/base/Data/Functor.hs                    | 0
 libraries/base/Data/Maybe.hs                      | 0
 libraries/base/Data/OldTypeable/Internal.hs       | 0
 libraries/base/Data/Typeable/Internal.hs          | 0
 libraries/base/Data/Version.hs                    | 0
 libraries/base/Debug/Trace.hs                     | 0
 libraries/base/Foreign/C/Error.hs                 | 0
 libraries/base/Foreign/C/String.hs                | 0
 libraries/base/Foreign/Marshal/Pool.hs            | 0
 libraries/base/GHC/Base.lhs                       | 0
 libraries/base/GHC/Event/EPoll.hsc                | 0
 libraries/base/GHC/Exts.hs                        | 8 ++++----
 libraries/base/GHC/Foreign.hs                     | 0
 libraries/base/GHC/ForeignPtr.hs                  | 0
 libraries/base/GHC/Generics.hs                    | 0
 libraries/base/GHC/IO.hs                          | 0
 libraries/base/GHC/IO/BufferedIO.hs               | 0
 libraries/base/GHC/IO/Device.hs                   | 0
 libraries/base/GHC/IO/Encoding.hs                 | 0
 libraries/base/GHC/IO/Encoding/CodePage/API.hs    | 0
 libraries/base/GHC/IO/Encoding/Failure.hs         | 0
 libraries/base/GHC/IO/Encoding/UTF16.hs           | 0
 libraries/base/GHC/IO/Encoding/UTF32.hs           | 0
 libraries/base/GHC/IO/FD.hs                       | 0
 libraries/base/GHC/IO/Handle.hs                   | 0
 libraries/base/GHC/IO/Handle/Internals.hs         | 0
 libraries/base/GHC/IO/Handle/Text.hs              | 0
 libraries/base/GHC/IO/Handle/Types.hs             | 0
 libraries/base/GHC/List.lhs                       | 6 +++---
 libraries/base/GHC/Stack.hsc                      | 0
 libraries/base/GHC/Weak.lhs                       | 0
 libraries/base/GHC/Windows.hs                     | 0
 libraries/base/System/Exit.hs                     | 0
 libraries/base/System/IO.hs                       | 0
 libraries/base/System/IO/Error.hs                 | 0
 libraries/base/System/Posix/Internals.hs          | 0
 libraries/base/Text/ParserCombinators/ReadP.hs    | 8 ++++----
 libraries/base/Text/ParserCombinators/ReadPrec.hs | 0
 libraries/base/Text/Read.hs                       | 0
 libraries/base/Text/Read/Lex.hs                   | 0
 45 files changed, 12 insertions(+), 12 deletions(-)

diff --git a/libraries/base/Control/Exception/Base.hs b/libraries/base/Control/Exception/Base.hs
index afb7151..c581d1a 100644
--- a/libraries/base/Control/Exception/Base.hs
+++ b/libraries/base/Control/Exception/Base.hs
@@ -387,7 +387,7 @@ recSelError, recConError, irrefutPatError, runtimeError,
         :: Addr# -> a   -- All take a UTF8-encoded C string
 
 recSelError              s = throw (RecSelError ("No match in record selector "
-			                         ++ unpackCStringUtf8# s))  -- No location info unfortunately
+                                                 ++ unpackCStringUtf8# s))  -- No location info unfortunately
 runtimeError             s = error (unpackCStringUtf8# s)                   -- No location info unfortunately
 absentError              s = error ("Oops!  Entered absent arg " ++ unpackCStringUtf8# s)
 
diff --git a/libraries/base/GHC/Exts.hs b/libraries/base/GHC/Exts.hs
index aa0fc93..6754edc 100755
--- a/libraries/base/GHC/Exts.hs
+++ b/libraries/base/GHC/Exts.hs
@@ -126,9 +126,9 @@ traceEvent = Debug.Trace.traceEventIO
 
 
 {- **********************************************************************
-*									*
+*                                                                       *
 *              SpecConstr annotation                                    *
-*									*
+*                                                                       *
 ********************************************************************** -}
 
 -- Annotating a type with NoSpecConstr will make SpecConstr
@@ -143,9 +143,9 @@ data SpecConstrAnnotation = NoSpecConstr | ForceSpecConstr
 
 
 {- **********************************************************************
-*									*
+*                                                                       *
 *              The IsList class                                         *
-*									*
+*                                                                       *
 ********************************************************************** -}
 
 -- | The 'IsList' class and its methods are intended to be used in
diff --git a/libraries/base/GHC/List.lhs b/libraries/base/GHC/List.lhs
index 2dffecc..ffcc8ab 100644
--- a/libraries/base/GHC/List.lhs
+++ b/libraries/base/GHC/List.lhs
@@ -646,9 +646,9 @@ xs !! (I# n0) | isTrue# (n0 <# 0#) =  error "Prelude.(!!): negative index\n"
 foldr2 :: (a -> b -> c -> c) -> c -> [a] -> [b] -> c
 foldr2 k z = go
   where
-	go []    _ys     = z
-	go _xs   []      = z
-	go (x:xs) (y:ys) = k x y (go xs ys)
+        go []    _ys     = z
+        go _xs   []      = z
+        go (x:xs) (y:ys) = k x y (go xs ys)
 {-# INLINE [0] foldr2 #-}
 
 foldr2_left :: (a -> b -> c -> d) -> d -> a -> ([b] -> c) -> [b] -> d
diff --git a/libraries/base/Text/ParserCombinators/ReadP.hs b/libraries/base/Text/ParserCombinators/ReadP.hs
index 48cbe57..4de0908 100644
--- a/libraries/base/Text/ParserCombinators/ReadP.hs
+++ b/libraries/base/Text/ParserCombinators/ReadP.hs
@@ -479,10 +479,10 @@ Here follow the properties:
 >  prop_Gather s =
 >    forAll readPWithoutReadS $ \p ->
 >      readP_to_S (gather p) s =~
->	 [ ((pre,x::Int),s')
->	 | (x,s') <- readP_to_S p s
->	 , let pre = take (length s - length s') s
->	 ]
+>        [ ((pre,x::Int),s')
+>        | (x,s') <- readP_to_S p s
+>        , let pre = take (length s - length s') s
+>        ]
 >
 >  prop_String_Yes this s =
 >    readP_to_S (string this) (this ++ s) =~



More information about the ghc-commits mailing list