[Git][ghc/ghc][master] Update outdated references to notes

Marge Bot (@marge-bot) gitlab at gitlab.haskell.org
Tue Feb 14 16:33:27 UTC 2023



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


Commits:
78aa3b39 by Simon Hengel at 2023-02-14T11:33:06-05:00
Update outdated references to notes

- - - - -


10 changed files:

- compiler/GHC/Core/DataCon.hs
- compiler/GHC/Hs/Binds.hs
- compiler/GHC/Hs/ImpExp.hs
- compiler/GHC/Parser.y
- compiler/GHC/Parser/Lexer.x
- compiler/GHC/Parser/PostProcess.hs
- compiler/GHC/Types/Fixity.hs
- compiler/GHC/Types/ForeignCall.hs
- compiler/Language/Haskell/Syntax/Decls.hs
- compiler/Language/Haskell/Syntax/Lit.hs


Changes:

=====================================
compiler/GHC/Core/DataCon.hs
=====================================
@@ -800,7 +800,7 @@ type DataConEnv a = UniqFM DataCon a     -- Keyed by DataCon
 -- emit a warning (in checkValidDataCon) and treat it like
 -- @(HsSrcBang _ NoSrcUnpack SrcLazy)@
 data HsSrcBang =
-  HsSrcBang SourceText -- Note [Pragma source text] in GHC.Types.SourceText
+  HsSrcBang SourceText -- Note [Pragma source text] in "GHC.Types.SourceText"
             SrcUnpackedness
             SrcStrictness
   deriving Data.Data


=====================================
compiler/GHC/Hs/Binds.hs
=====================================
@@ -680,7 +680,7 @@ type instance XSpecInstSig      (GhcPass p) = (EpAnn [AddEpAnn], SourceText)
 type instance XMinimalSig       (GhcPass p) = (EpAnn [AddEpAnn], SourceText)
 type instance XSCCFunSig        (GhcPass p) = (EpAnn [AddEpAnn], SourceText)
 type instance XCompleteMatchSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)
-    -- SourceText: Note [Pragma source text] in GHC.Types.SourceText
+    -- SourceText: Note [Pragma source text] in "GHC.Types.SourceText"
 type instance XXSig             GhcPs = DataConCantHappen
 type instance XXSig             GhcRn = IdSig
 type instance XXSig             GhcTc = IdSig


=====================================
compiler/GHC/Hs/ImpExp.hs
=====================================
@@ -77,7 +77,7 @@ type instance ImportDeclPkgQual GhcTc = PkgQual
 type instance XCImportDecl  GhcPs = XImportDeclPass
 type instance XCImportDecl  GhcRn = XImportDeclPass
 type instance XCImportDecl  GhcTc = DataConCantHappen
-                                 -- Note [Pragma source text] in GHC.Types.SourceText
+                                 -- Note [Pragma source text] in "GHC.Types.SourceText"
 
 data XImportDeclPass = XImportDeclPass
     { ideclAnn        :: EpAnn EpAnnImportDecl


=====================================
compiler/GHC/Parser.y
=====================================
@@ -3950,7 +3950,7 @@ getPRIMWORDs    (L _ (ITprimword   src _)) = src
 
 getLABELVARIDs   (L _ (ITlabelvarid src _)) = src
 
--- See Note [Pragma source text] in "GHC.Types.Basic" for the following
+-- See Note [Pragma source text] in "GHC.Types.SourceText" for the following
 getINLINE_PRAGs       (L _ (ITinline_prag       _ inl _)) = inlineSpecSource inl
 getOPAQUE_PRAGs       (L _ (ITopaque_prag       src))     = src
 getSPEC_PRAGs         (L _ (ITspec_prag         src))     = src


=====================================
compiler/GHC/Parser/Lexer.x
=====================================
@@ -771,7 +771,7 @@ data Token
   | ITdependency
   | ITrequires
 
-  -- Pragmas, see  Note [Pragma source text] in "GHC.Types.Basic"
+  -- Pragmas, see  Note [Pragma source text] in "GHC.Types.SourceText"
   | ITinline_prag       SourceText InlineSpec RuleMatchInfo
   | ITopaque_prag       SourceText
   | ITspec_prag         SourceText                -- SPECIALISE
@@ -855,17 +855,17 @@ data Token
   | ITlabelvarid SourceText FastString   -- Overloaded label: #x
                                          -- The SourceText is required because we can
                                          -- have a string literal as a label
-                                         -- Note [Literal source text] in "GHC.Types.Basic"
+                                         -- Note [Literal source text] in "GHC.Types.SourceText"
 
-  | ITchar     SourceText Char       -- Note [Literal source text] in "GHC.Types.Basic"
-  | ITstring   SourceText FastString -- Note [Literal source text] in "GHC.Types.Basic"
-  | ITinteger  IntegralLit           -- Note [Literal source text] in "GHC.Types.Basic"
+  | ITchar     SourceText Char       -- Note [Literal source text] in "GHC.Types.SourceText"
+  | ITstring   SourceText FastString -- Note [Literal source text] in "GHC.Types.SourceText"
+  | ITinteger  IntegralLit           -- Note [Literal source text] in "GHC.Types.SourceText"
   | ITrational FractionalLit
 
-  | ITprimchar   SourceText Char     -- Note [Literal source text] in "GHC.Types.Basic"
-  | ITprimstring SourceText ByteString -- Note [Literal source text] in "GHC.Types.Basic"
-  | ITprimint    SourceText Integer  -- Note [Literal source text] in "GHC.Types.Basic"
-  | ITprimword   SourceText Integer  -- Note [Literal source text] in "GHC.Types.Basic"
+  | ITprimchar   SourceText Char     -- Note [Literal source text] in "GHC.Types.SourceText"
+  | ITprimstring SourceText ByteString -- Note [Literal source text] in "GHC.Types.SourceText"
+  | ITprimint    SourceText Integer  -- Note [Literal source text] in "GHC.Types.SourceText"
+  | ITprimword   SourceText Integer  -- Note [Literal source text] in "GHC.Types.SourceText"
   | ITprimfloat  FractionalLit
   | ITprimdouble FractionalLit
 


=====================================
compiler/GHC/Parser/PostProcess.hs
=====================================
@@ -2587,7 +2587,7 @@ mkInlinePragma :: SourceText -> (InlineSpec, RuleMatchInfo) -> Maybe Activation
 -- The (Maybe Activation) is because the user can omit
 -- the activation spec (and usually does)
 mkInlinePragma src (inl, match_info) mb_act
-  = InlinePragma { inl_src = src -- Note [Pragma source text] in GHC.Types.SourceText
+  = InlinePragma { inl_src = src -- Note [Pragma source text] in "GHC.Types.SourceText"
                  , inl_inline = inl
                  , inl_sat    = Nothing
                  , inl_act    = act


=====================================
compiler/GHC/Types/Fixity.hs
=====================================
@@ -24,7 +24,7 @@ import GHC.Utils.Binary
 import Data.Data hiding (Fixity, Prefix, Infix)
 
 data Fixity = Fixity SourceText Int FixityDirection
-  -- Note [Pragma source text]
+  -- Note [Pragma source text] in "GHC.Types.SourceText"
   deriving Data
 
 instance Outputable Fixity where


=====================================
compiler/GHC/Types/ForeignCall.hs
=====================================
@@ -99,7 +99,7 @@ playInterruptible _ = False
 data CExportSpec
   = CExportStatic               -- foreign export ccall foo :: ty
         SourceText              -- of the CLabelString.
-                                -- See Note [Pragma source text] in GHC.Types.SourceText
+                                -- See Note [Pragma source text] in "GHC.Types.SourceText"
         CLabelString            -- C Name of exported function
         CCallConv
   deriving Data
@@ -117,7 +117,7 @@ data CCallTarget
   -- An "unboxed" ccall# to named function in a particular package.
   = StaticTarget
         SourceText                -- of the CLabelString.
-                                  -- See Note [Pragma source text] in GHC.Types.SourceText
+                                  -- See Note [Pragma source text] in "GHC.Types.SourceText"
         CLabelString                    -- C-land name of label.
 
         (Maybe Unit)                    -- What package the function is in.
@@ -233,7 +233,7 @@ instance Outputable CCallSpec where
         = text "__ffi_dyn_ccall" <> gc_suf <+> text "\"\""
 
 -- The filename for a C header file
--- Note [Pragma source text] in GHC.Types.SourceText
+-- Note [Pragma source text] in "GHC.Types.SourceText"
 data Header = Header SourceText FastString
     deriving (Eq, Data)
 
@@ -247,7 +247,7 @@ instance Outputable Header where
 --        'GHC.Parser.Annotation.AnnClose' @'\#-}'@,
 
 -- For details on above see Note [exact print annotations] in "GHC.Parser.Annotation"
-data CType = CType SourceText -- Note [Pragma source text] in GHC.Types.SourceText
+data CType = CType SourceText -- Note [Pragma source text] in "GHC.Types.SourceText"
                    (Maybe Header) -- header to include for this type
                    (SourceText,FastString) -- the type itself
     deriving (Eq, Data)


=====================================
compiler/Language/Haskell/Syntax/Decls.hs
=====================================
@@ -1599,7 +1599,7 @@ data RuleDecl pass
        { rd_ext  :: XHsRule pass
            -- ^ After renamer, free-vars from the LHS and RHS
        , rd_name :: XRec pass RuleName
-           -- ^ Note [Pragma source text] in "GHC.Types.Basic"
+           -- ^ Note [Pragma source text] in "GHC.Types.SourceText"
        , rd_act  :: Activation
        , rd_tyvs :: Maybe [LHsTyVarBndr () (NoGhcTc pass)]
            -- ^ Forall'd type vars


=====================================
compiler/Language/Haskell/Syntax/Lit.hs
=====================================
@@ -42,9 +42,9 @@ import Prelude (Integer)
 ************************************************************************
 -}
 
--- Note [Literal source text] in GHC.Types.Basic for SourceText fields in
+-- Note [Literal source text] in "GHC.Types.SourceText" for SourceText fields in
 -- the following
--- Note [Trees That Grow] in Language.Haskell.Syntax.Extension for the Xxxxx
+-- Note [Trees That Grow] in "Language.Haskell.Syntax.Extension" for the Xxxxx
 -- fields in the following
 -- | Haskell Literal
 data HsLit x
@@ -107,7 +107,7 @@ data HsOverLit p
   | XOverLit
       !(XXOverLit p)
 
--- Note [Literal source text] in GHC.Types.Basic for SourceText fields in
+-- Note [Literal source text] in "GHC.Types.SourceText" for SourceText fields in
 -- the following
 -- | Overloaded Literal Value
 data OverLitVal



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/78aa3b39133feb165b6e305af1b84620a450c8ef

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/78aa3b39133feb165b6e305af1b84620a450c8ef
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/20230214/410d9da3/attachment-0001.html>


More information about the ghc-commits mailing list