[Git][ghc/ghc][wip/T23578] Fix indentation and alignment
Jaro Reinders (@Noughtmare)
gitlab at gitlab.haskell.org
Mon Jul 10 13:09:15 UTC 2023
Jaro Reinders pushed to branch wip/T23578 at Glasgow Haskell Compiler / GHC
Commits:
76332665 by Jaro Reinders at 2023-07-10T15:09:08+02:00
Fix indentation and alignment
- - - - -
1 changed file:
- libraries/base/GHC/Word.hs
Changes:
=====================================
libraries/base/GHC/Word.hs
=====================================
@@ -767,21 +767,21 @@ instance Enum Word64 where
eftWord64 :: Word64# -> Word64# -> [Word64]
-- [x1..x2]
eftWord64 x0 y | isTrue# (x0 `gtWord64#` y) = []
- | otherwise = go x0
- where
- go x = W64# x : if isTrue# (x `eqWord64#` y)
- then []
- else go (x `plusWord64#` (wordToWord64# 1##))
+ | otherwise = go x0
+ where
+ go x = W64# x : if isTrue# (x `eqWord64#` y)
+ then []
+ else go (x `plusWord64#` (wordToWord64# 1##))
{-# INLINE [0] eftWord64FB #-} -- See Note [Inline FB functions] in GHC.List
eftWord64FB :: (Word64 -> r -> r) -> r -> Word64# -> Word64# -> r
eftWord64FB c n x0 y | isTrue# (x0 `gtWord64#` y) = n
- | otherwise = go x0
- where
- go x = W64# x `c` if isTrue# (x `eqWord64#` y)
- then n
- else go (x `plusWord64#` (wordToWord64# 1##))
- -- Watch out for y=maxBound; hence ==, not >
+ | otherwise = go x0
+ where
+ go x = W64# x `c` if isTrue# (x `eqWord64#` y)
+ then n
+ else go (x `plusWord64#` (wordToWord64# 1##))
+ -- Watch out for y=maxBound; hence ==, not >
-- Be very careful not to have more than one "c"
-- so that when eftInfFB is inlined we can inline
-- whatever is bound to "c"
@@ -802,14 +802,14 @@ efdWord64 :: Word64# -> Word64# -> [Word64]
-- [x1,x2..maxWord64]
efdWord64 x1 x2
| isTrue# (x2 `geWord64#` x1) = case maxBound of W64# y -> efdtWord64Up x1 x2 y
- | otherwise = case minBound of W64# y -> efdtWord64Dn x1 x2 y
+ | otherwise = case minBound of W64# y -> efdtWord64Dn x1 x2 y
{-# NOINLINE [1] efdtWord64 #-}
efdtWord64 :: Word64# -> Word64# -> Word64# -> [Word64]
-- [x1,x2..y]
efdtWord64 x1 x2 y
| isTrue# (x2 `geWord64#` x1) = efdtWord64Up x1 x2 y
- | otherwise = efdtWord64Dn x1 x2 y
+ | otherwise = efdtWord64Dn x1 x2 y
{-# INLINE [0] efdtWord64FB #-} -- See Note [Inline FB functions] in GHC.List
efdtWord64FB :: (Word64 -> r -> r) -> r -> Word64# -> Word64# -> Word64# -> r
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/763326655933962029a27ca8454ea4a54392e0e7
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/763326655933962029a27ca8454ea4a54392e0e7
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/20230710/781d687c/attachment-0001.html>
More information about the ghc-commits
mailing list