Skip to content

Commit

Permalink
Work around unwanted Haddock code blocks (#25)
Browse files Browse the repository at this point in the history
  • Loading branch information
meooow25 authored Nov 13, 2024
1 parent 83370bb commit c684894
Show file tree
Hide file tree
Showing 2 changed files with 5 additions and 5 deletions.
6 changes: 3 additions & 3 deletions src/Regex/Internal/CharSet.hs
Original file line number Diff line number Diff line change
Expand Up @@ -46,18 +46,18 @@ instance Show CharSet where
showsPrec p cs = showParen (p > 10) $
showString "fromRanges " . shows (ranges cs)

-- | @fromString = 'fromList'@
-- | @fromString@ = 'fromList'
instance IsString CharSet where
fromString = fromList

-- | @(<>) = 'union'@
-- | @(<>)@ = 'union'
instance Semigroup CharSet where
(<>) = union
sconcat = F.foldl' union empty
{-# INLINE sconcat #-}
stimes = stimesIdempotentMonoid

-- | @mempty = 'empty'@
-- | @mempty@ = 'empty'
instance Monoid CharSet where
mempty = empty
mconcat = F.foldl' union empty
Expand Down
4 changes: 2 additions & 2 deletions src/Regex/Internal/Regex.hs
Original file line number Diff line number Diff line change
Expand Up @@ -120,13 +120,13 @@ instance Alternative (RE c) where
some re = liftA2' (:) re (many re)
many = fmap reverse . foldlMany' (flip (:)) []

-- | @(<>) = liftA2 (<>)@
-- | @(<>)@ = @liftA2 (<>)@
instance Semigroup a => Semigroup (RE c a) where
(<>) = liftA2 (<>)
sconcat = fmap sconcat . sequenceA
{-# INLINE sconcat #-}

-- | @mempty = pure mempty@
-- | @mempty@ = @pure mempty@
instance Monoid a => Monoid (RE c a) where
mempty = pure mempty
mconcat = fmap mconcat . sequenceA
Expand Down

0 comments on commit c684894

Please sign in to comment.