[Git][ghc/ghc][wip/backports-8.10] parser: Backport comb5 combinator

Ben Gamari gitlab at gitlab.haskell.org
Sun Dec 13 22:46:57 UTC 2020



Ben Gamari pushed to branch wip/backports-8.10 at Glasgow Haskell Compiler / GHC


Commits:
035e9e43 by Ben Gamari at 2020-12-13T17:46:16-05:00
parser: Backport comb5 combinator

- - - - -


1 changed file:

- compiler/parser/Parser.y


Changes:

=====================================
compiler/parser/Parser.y
=====================================
@@ -3898,6 +3898,11 @@ comb4 a b c d = a `seq` b `seq` c `seq` d `seq`
     (combineSrcSpans (getLoc a) $ combineSrcSpans (getLoc b) $
                 combineSrcSpans (getLoc c) (getLoc d))
 
+comb5 :: Located a -> Located b -> Located c -> Located d -> Located e -> SrcSpan
+comb5 a b c d e = a `seq` b `seq` c `seq` d `seq` e `seq`
+    (combineSrcSpans (getLoc a) $ combineSrcSpans (getLoc b) $
+       combineSrcSpans (getLoc c) $ combineSrcSpans (getLoc d) (getLoc e))
+
 -- strict constructor version:
 {-# INLINE sL #-}
 sL :: HasSrcSpan a => SrcSpan -> SrcSpanLess a -> a



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/035e9e43be763626b563a08c138e10df0538aa54

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/035e9e43be763626b563a08c138e10df0538aa54
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/20201213/ee829971/attachment.html>


More information about the ghc-commits mailing list