[Git][ghc/ghc][wip/ttg/types/basic] whitespace

Hassan Al-Awwadi (@hassan.awwadi) gitlab at gitlab.haskell.org
Mon Oct 21 07:55:21 UTC 2024



Hassan Al-Awwadi pushed to branch wip/ttg/types/basic at Glasgow Haskell Compiler / GHC


Commits:
632e137e by Hassan Al-Awwadi at 2024-10-21T09:54:46+02:00
whitespace

- - - - -


2 changed files:

- compiler/GHC/Hs/InlinePragma.hs
- compiler/Language/Haskell/Syntax/InlinePragma.hs


Changes:

=====================================
compiler/GHC/Hs/InlinePragma.hs
=====================================
@@ -24,7 +24,7 @@ module GHC.Hs.InlinePragma(
         pprInline, pprInlineDebug,
         convertInlinePragma, convertInlineSpec, convertActivation
 
-) where 
+) where
 
 import GHC.Prelude
 import GHC.Types.SourceText(SourceText (..), pprWithSourceText)
@@ -59,7 +59,7 @@ type instance XOpaque    (GhcPass _) = SourceText
 type instance XNoUserInlinePrag (GhcPass _) = NoExtField
 type instance XXInlineSpec      (GhcPass _) = DataConCantHappen
 
-deriving instance Eq (InlineSpec (GhcPass p))  
+deriving instance Eq (InlineSpec (GhcPass p))
 
 instance Show (InlineSpec (GhcPass p)) where
   show (Inline s)    = "Inline "    ++ show s
@@ -77,7 +77,7 @@ type instance XFinalActive  (GhcPass _) = NoExtField
 type instance XNeverActive  (GhcPass _) = NoExtField
 type instance XXActivation  (GhcPass _) = DataConCantHappen
 
-deriving instance Eq (Activation (GhcPass p))  
+deriving instance Eq (Activation (GhcPass p))
     -- Eq used in comparing rules in GHC.Hs.Decls
 
 
@@ -274,7 +274,7 @@ inlineSpecSource spec = case spec of
 -- exprIsConApp_maybe can "see" its unfolding
 -- (However, its actual Unfolding is a DFunUnfolding, which is
 --  never inlined other than via exprIsConApp_maybe.)
-dfunInlinePragma = let 
+dfunInlinePragma = let
   always_active         = set_pragma_activation defaultInlinePragma (AlwaysActive noExtField)
   always_active_conlike = set_pragma_rule always_active ConLike
   in always_active_conlike
@@ -284,7 +284,7 @@ isDefaultInlinePragma (InlinePragma { inl_act = activation
                                     , inl_rule = match_info
                                     , inl_inline = inline })
   = noUserInlineSpec inline && isAlwaysActive activation && isFunLike match_info
-isDefaultInlinePragma (XCInlinePragma impossible) = dataConCantHappen impossible 
+isDefaultInlinePragma (XCInlinePragma impossible) = dataConCantHappen impossible
 
 isInlinePragma :: InlinePragma (GhcPass p) -> Bool
 isInlinePragma prag@(InlinePragma{}) = case inl_inline prag of
@@ -538,7 +538,7 @@ inlinePragmaName (Inlinable         _)  = text "INLINABLE"
 inlinePragmaName (NoInline          _)  = text "NOINLINE"
 inlinePragmaName (Opaque            _)  = text "OPAQUE"
 inlinePragmaName (NoUserInlinePrag  _)   = empty
-inlinePragmaName (XInlineSpec impossible) = dataConCantHappen impossible 
+inlinePragmaName (XInlineSpec impossible) = dataConCantHappen impossible
 
 -- | Pretty-print without displaying the user-specified 'InlineSpec'.
 pprInline :: InlinePragma (GhcPass p) -> SDoc


=====================================
compiler/Language/Haskell/Syntax/InlinePragma.hs
=====================================
@@ -1,7 +1,7 @@
-module Language.Haskell.Syntax.InlinePragma where 
+module Language.Haskell.Syntax.InlinePragma where
 
 import GHC.Prelude
-import Data.Data 
+
 import Language.Haskell.Syntax.Basic(Arity)
 import Language.Haskell.Syntax.Extension
 
@@ -21,7 +21,7 @@ data InlinePragma p           -- Note [InlinePragma] in GHC.Hs.InlinePragma
                                       -- See Note [inl_inline and inl_act] in GHC.Hs.InlinePragma
 
       , inl_rule   :: RuleMatchInfo   -- Should the function be treated like a constructor?
-    } 
+    }
   | XCInlinePragma (XXCInlinePragma p)
 
 
@@ -33,7 +33,7 @@ data InlineSpec p   -- What the user's INLINE pragma looked like
   | Opaque    (XOpaque    p)       -- User wrote OPAQUE
                                -- Each of the above keywords is accompanied with
                                -- a string of type SourceText written by the user
-  | NoUserInlinePrag (XNoUserInlinePrag p) 
+  | NoUserInlinePrag (XNoUserInlinePrag p)
                      -- User did not write any of INLINE/INLINABLE/NOINLINE
                      -- e.g. in `defaultInlinePragma` or when created by CSE
   | XInlineSpec (XXInlineSpec p)



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/632e137e6240953e0824dad3260781cce1273cc5

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/632e137e6240953e0824dad3260781cce1273cc5
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/20241021/9453bdca/attachment-0001.html>


More information about the ghc-commits mailing list