[Git][ghc/ghc][master] Run fix-whitespace on compiler/

Marge Bot (@marge-bot) gitlab at gitlab.haskell.org
Sat Mar 8 13:51:15 UTC 2025



Marge Bot pushed to branch master at Glasgow Haskell Compiler / GHC


Commits:
324222bd by Oleg Grenrus at 2025-03-08T08:50:18-05:00
Run fix-whitespace on compiler/

https://hackage.haskell.org/package/fix-whitespace

IMO this should be included into lint suite

- - - - -


21 changed files:

- compiler/GHC/Cmm/CallConv.hs
- compiler/GHC/Cmm/Liveness.hs
- compiler/GHC/CmmToAsm/Reg/Linear/Base.hs
- compiler/GHC/CmmToAsm/X86/RegInfo.hs
- compiler/GHC/Core/LateCC/TopLevelBinds.hs
- compiler/GHC/Data/BooleanFormula.hs
- compiler/GHC/Data/Graph/Color.hs
- compiler/GHC/Hs/Instances.hs
- compiler/GHC/Hs/Specificity.hs
- compiler/GHC/JS/Opt/Expr.hs
- compiler/GHC/JS/Opt/Simple.hs
- compiler/GHC/Platform/LoongArch64.hs
- compiler/GHC/StgToCmm/TagCheck.hs
- compiler/GHC/Tc/Errors/Hole/FitTypes.hs
- compiler/GHC/Tc/Errors/Hole/Plugin.hs
- compiler/GHC/Tc/Solver/Solve.hs
- compiler/GHC/Tc/TyCl/Class.hs
- compiler/GHC/Tc/Types/TcRef.hs
- compiler/GHC/Types/PkgQual.hs
- compiler/GHC/Types/SptEntry.hs
- compiler/GHC/Utils/Unique.hs


Changes:

=====================================
compiler/GHC/Cmm/CallConv.hs
=====================================
@@ -321,4 +321,4 @@ backend is liable to compile code using e.g. the ZMM1 STG register to uses of
 X86 machine registers xmm1, xmm2, xmm3, xmm4, instead of just zmm1. This would
 mean that LLVM produces ABI-incompatible code that would result in segfaults in
 the RTS.
--}
\ No newline at end of file
+-}


=====================================
compiler/GHC/Cmm/Liveness.hs
=====================================
@@ -155,4 +155,3 @@ xferLiveL platform (BlockCC eNode middle xNode) fBase =
         !result = foldNodesBwdOO (gen_killL platform) middle joined
     in mapSingleton (entryLabel eNode) result
 
-


=====================================
compiler/GHC/CmmToAsm/Reg/Linear/Base.hs
=====================================
@@ -207,4 +207,3 @@ data RA_State freeRegs
 
         }
 
-


=====================================
compiler/GHC/CmmToAsm/X86/RegInfo.hs
=====================================
@@ -68,4 +68,3 @@ normalRegColors platform =
 --             ,"#afafaf","#b6b6b6","#bdbdbd","#c4c4c4","#cbcbcb"
 --             ,"#d2d2d2","#d9d9d9","#e0e0e0"]
 
-


=====================================
compiler/GHC/Core/LateCC/TopLevelBinds.hs
=====================================
@@ -125,4 +125,4 @@ topLevelBindsCC pred core_bind =
       let name = idName bndr
           cc_loc = nameSrcSpan name
           cc_name = getOccFS name
-      insertCC cc_name cc_loc rhs
\ No newline at end of file
+      insertCC cc_name cc_loc rhs


=====================================
compiler/GHC/Data/BooleanFormula.hs
=====================================
@@ -237,4 +237,4 @@ pprBooleanFormulaNormal = go
     go (And xs)   = fsep $ punctuate comma (map (go . unLoc) xs)
     go (Or [])    = keyword $ text "FALSE"
     go (Or xs)    = fsep $ intersperse vbar (map (go . unLoc) xs)
-    go (Parens x) = parens (go $ unLoc x)
\ No newline at end of file
+    go (Parens x) = parens (go $ unLoc x)


=====================================
compiler/GHC/Data/Graph/Color.hs
=====================================
@@ -380,5 +380,3 @@ selectColor colors graph u
 
    in   chooseColor
 
-
-


=====================================
compiler/GHC/Hs/Instances.hs
=====================================
@@ -594,4 +594,4 @@ deriving instance Data XViaStrategyPs
 -- ---------------------------------------------------------------------
 
 deriving instance (Typeable p, Data (Anno (IdGhcP p)), Data (IdGhcP p)) => Data (BooleanFormula (GhcPass p))
----------------------------------------------------------------------
\ No newline at end of file
+---------------------------------------------------------------------


=====================================
compiler/GHC/Hs/Specificity.hs
=====================================
@@ -49,4 +49,3 @@ instance NFData ForAllTyFlag where
   rnf (Invisible spec) = rnf spec
   rnf Required = ()
 
-


=====================================
compiler/GHC/JS/Opt/Expr.hs
=====================================
@@ -183,4 +183,4 @@ eqVal (JStr s1) (JStr s2)   = s1 == s2
 eqVal (JBool b1) (JBool b2) = b1 == b2
 eqVal (JDouble (SaneDouble d1)) (JDouble (SaneDouble d2))
   | not (isNaN d1) && not (isNaN d2) = d1 == d2
-eqVal _ _ = False
\ No newline at end of file
+eqVal _ _ = False


=====================================
compiler/GHC/JS/Opt/Simple.hs
=====================================
@@ -604,4 +604,4 @@ isClosureAllocator "h$c21" = True
 isClosureAllocator "h$c22" = True
 isClosureAllocator "h$c23" = True
 isClosureAllocator "h$c24" = True
-isClosureAllocator _       = False
\ No newline at end of file
+isClosureAllocator _       = False


=====================================
compiler/GHC/Platform/LoongArch64.hs
=====================================
@@ -6,4 +6,4 @@ import GHC.Prelude
 
 #define MACHREGS_NO_REGS 0
 #define MACHREGS_loongarch64 1
-#include "CodeGen.Platform.h"
\ No newline at end of file
+#include "CodeGen.Platform.h"


=====================================
compiler/GHC/StgToCmm/TagCheck.hs
=====================================
@@ -175,4 +175,3 @@ checkArgStatic msg MarkedStrict arg = whenCheckTags $
           then return ()
           else pprPanic "Arg not tagged as expected" (ppr msg <+> ppr arg)
 
-


=====================================
compiler/GHC/Tc/Errors/Hole/FitTypes.hs
=====================================
@@ -128,4 +128,3 @@ hfIsLcl hf@(HoleFit {}) = case hfCand hf of
                             NameHFCand _  -> False
                             GreHFCand gre -> gre_lcl gre
 
-


=====================================
compiler/GHC/Tc/Errors/Hole/Plugin.hs
=====================================
@@ -26,4 +26,4 @@ data HoleFitPluginR = forall s. HoleFitPluginR
     -- ^ The function defining the plugin itself
   , hfPluginStop :: TcRef s -> TcM ()
     -- ^ Cleanup of state, guaranteed to be called even on error
-  }
\ No newline at end of file
+  }


=====================================
compiler/GHC/Tc/Solver/Solve.hs
=====================================
@@ -1538,4 +1538,3 @@ runTcPluginSolvers solvers all_cts
       CtGiven  {} -> (ct:givens, wanteds)
       CtWanted {} -> (givens, (ev,ct):wanteds)
 
-


=====================================
compiler/GHC/Tc/TyCl/Class.hs
=====================================
@@ -598,4 +598,4 @@ warnMissingAT name
                   $ InvalidAssoc $ InvalidAssocInstance
                   $ AssocInstanceMissing name
        ; diagnosticTc  (warn && hsc_src == HsSrcFile) diag
-                       }
\ No newline at end of file
+                       }


=====================================
compiler/GHC/Tc/Types/TcRef.hs
=====================================
@@ -34,4 +34,4 @@ updTcRefM ref upd
   = do { contents      <- readTcRef ref
        ; !new_contents <- upd contents
        ; writeTcRef ref new_contents }
-{-# INLINE updTcRefM #-}
\ No newline at end of file
+{-# INLINE updTcRefM #-}


=====================================
compiler/GHC/Types/PkgQual.hs
=====================================
@@ -57,4 +57,3 @@ instance Binary PkgQual where
       2 -> do u <- get bh
               return (OtherPkg u)
       _ -> fail "instance Binary PkgQual: Invalid tag"
-


=====================================
compiler/GHC/Types/SptEntry.hs
=====================================
@@ -14,4 +14,3 @@ data SptEntry = SptEntry Id Fingerprint
 instance Outputable SptEntry where
   ppr (SptEntry id fpr) = ppr id <> colon <+> ppr fpr
 
-


=====================================
compiler/GHC/Utils/Unique.hs
=====================================
@@ -32,4 +32,4 @@ sameUnique x y = getUnique x == getUnique y
 {-# INLINE anyOfUnique #-}
 #endif
 anyOfUnique :: Uniquable a => a -> [Unique] -> Bool
-anyOfUnique tc xs = getUnique tc `elem` xs
\ No newline at end of file
+anyOfUnique tc xs = getUnique tc `elem` xs



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/324222bd2d67af2131f5355cb220584bd499295f

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/324222bd2d67af2131f5355cb220584bd499295f
You're receiving this email because of your account on gitlab.haskell.org.


-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20250308/41eef473/attachment-0001.html>


More information about the ghc-commits mailing list