[Git][ghc/ghc][master] Remove trailing whitespace

Ben Gamari gitlab at gitlab.haskell.org
Sat Jun 8 17:41:55 UTC 2019



Ben Gamari pushed to branch master at Glasgow Haskell Compiler / GHC


Commits:
709290b0 by Matthew Pickering at 2019-06-08T17:38:15Z
Remove trailing whitespace

[skip ci]

This should really be caught by the linters! (#16711)

- - - - -


7 changed files:

- compiler/cmm/MkGraph.hs
- compiler/codeGen/StgCmmForeign.hs
- compiler/ghci/LinkerTypes.hs
- compiler/main/HscTypes.hs
- compiler/main/Packages.hs
- compiler/specialise/Specialise.hs
- compiler/stgSyn/StgSyn.hs


Changes:

=====================================
compiler/cmm/MkGraph.hs
=====================================
@@ -335,8 +335,8 @@ copyIn dflags conv area formals extra_stk
           local = CmmLocal reg
           width = cmmRegWidth dflags local
           expr  = CmmMachOp (MO_XX_Conv (wordWidth dflags) width) [stack_slot]
-        in CmmAssign local expr 
-         
+        in CmmAssign local expr
+
       | otherwise =
          CmmAssign (CmmLocal reg) (CmmLoad (CmmStackSlot area off) ty)
          where ty = localRegType reg


=====================================
compiler/codeGen/StgCmmForeign.hs
=====================================
@@ -526,7 +526,7 @@ closureField dflags off = off + fixedHdrSize dflags
 -- demonstrated that this leads to bad behavior in the presence
 -- of unsafeCoerce#. Returning to the above example, suppose the
 -- Haskell call looked like
---   foo (unsafeCoerce# p) 
+--   foo (unsafeCoerce# p)
 -- where the types of expressions comprising the arguments are
 --   p :: (Any :: TYPE 'UnliftedRep)
 --   i :: Int#
@@ -591,7 +591,7 @@ add_shim dflags ty expr = case ty of
 -- the offset of each argument when used as a C FFI argument.
 -- See Note [Unlifted boxed arguments to foreign calls]
 collectStgFArgTypes :: Type -> [StgFArgType]
-collectStgFArgTypes = go [] 
+collectStgFArgTypes = go []
   where
     -- Skip foralls
     go bs (ForAllTy _ res) = go bs res


=====================================
compiler/ghci/LinkerTypes.hs
=====================================
@@ -28,7 +28,7 @@ import NameEnv                 ( NameEnv )
 import Name                    ( Name )
 import GHCi.RemoteTypes        ( ForeignHValue )
 
-type ClosureEnv = NameEnv (Name, ForeignHValue) 
+type ClosureEnv = NameEnv (Name, ForeignHValue)
 
 newtype DynLinker =
   DynLinker { dl_mpls :: MVar (Maybe PersistentLinkerState) }


=====================================
compiler/main/HscTypes.hs
=====================================
@@ -443,7 +443,7 @@ data HscEnv
                 -- time it is needed.
 
         , hsc_dynLinker :: DynLinker
-                -- ^ dynamic linker. 
+                -- ^ dynamic linker.
 
  }
 


=====================================
compiler/main/Packages.hs
=====================================
@@ -1470,8 +1470,8 @@ mkPackageState dflags dbs preload0 = do
             _  -> unit'
       addIfMorePreferable m unit = addToUDFM_C preferLater m (fsPackageName unit) unit
       -- This is the set of maximally preferable packages. In fact, it is a set of
-      -- most preferable *units* keyed by package name, which act as stand-ins in 
-      -- for "a package in a database". We use units here because we don't have 
+      -- most preferable *units* keyed by package name, which act as stand-ins in
+      -- for "a package in a database". We use units here because we don't have
       -- "a package in a database" as a type currently.
       mostPreferablePackageReps = if gopt Opt_HideAllPackages dflags
                     then emptyUDFM
@@ -1481,7 +1481,7 @@ mkPackageState dflags dbs preload0 = do
       -- with the most preferable unit for package. Being equi-preferable means that
       -- they must be in the same database, with the same version, and the same pacakge name.
       --
-      -- We must take care to consider all these units and not just the most 
+      -- We must take care to consider all these units and not just the most
       -- preferable one, otherwise we can end up with problems like #16228.
       mostPreferable u =
         case lookupUDFM mostPreferablePackageReps (fsPackageName u) of


=====================================
compiler/specialise/Specialise.hs
=====================================
@@ -938,7 +938,7 @@ tryWarnMissingSpecs dflags callers fn calls_for_fn
   | otherwise                             = return ()
   where
     allCallersInlined = all (isAnyInlinePragma . idInlinePragma) callers
-    doWarn reason = 
+    doWarn reason =
       warnMsg reason
         (vcat [ hang (text ("Could not specialise imported function") <+> quotes (ppr fn))
                 2 (vcat [ text "when specialising" <+> quotes (ppr caller)


=====================================
compiler/stgSyn/StgSyn.hs
=====================================
@@ -686,7 +686,7 @@ data StgOp
 
   | StgPrimCallOp PrimCall
 
-  | StgFCallOp ForeignCall Type Unique 
+  | StgFCallOp ForeignCall Type Unique
         -- The Unique is occasionally needed by the C pretty-printer
         -- (which lacks a unique supply), notably when generating a
         -- typedef for foreign-export-dynamic. The Type, which is



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/commit/709290b01c3c63137d863d6fdd97dabdfe47eb29

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/commit/709290b01c3c63137d863d6fdd97dabdfe47eb29
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/20190608/50f46c0d/attachment-0001.html>


More information about the ghc-commits mailing list