#if __GLASGOW_HASKELL__ >= 800
#endif
module Text.RE.TDFA.ByteString.Lazy
(
(*=~)
, (?=~)
, (=~)
, (=~~)
, module Text.RE
, RE
, reSource
, compileRegex
, compileRegexWith
, escape
, module Text.RE.TDFA.RE
) where
import Prelude.Compat
import qualified Data.ByteString.Lazy.Char8 as LBS
import Data.Typeable
import Text.Regex.Base
import Text.RE
import Text.RE.Types.IsRegex
import Text.RE.Internal.AddCaptureNames
import Text.RE.TDFA.RE
import qualified Text.Regex.TDFA as TDFA
(*=~) :: LBS.ByteString
-> RE
-> Matches LBS.ByteString
(*=~) bs rex = addCaptureNamesToMatches (reCaptureNames rex) $ match (reRegex rex) bs
(?=~) :: LBS.ByteString
-> RE
-> Match LBS.ByteString
(?=~) bs rex = addCaptureNamesToMatch (reCaptureNames rex) $ match (reRegex rex) bs
(=~) :: ( Typeable a
, RegexContext TDFA.Regex LBS.ByteString a
, RegexMaker TDFA.Regex TDFA.CompOption TDFA.ExecOption String
)
=> LBS.ByteString
-> RE
-> a
(=~) bs rex = addCaptureNames (reCaptureNames rex) $ match (reRegex rex) bs
(=~~) :: ( Monad m
, Functor m
, Typeable a
, RegexContext TDFA.Regex LBS.ByteString a
, RegexMaker TDFA.Regex TDFA.CompOption TDFA.ExecOption String
)
=> LBS.ByteString
-> RE
-> m a
(=~~) bs rex = addCaptureNames (reCaptureNames rex) <$> matchM (reRegex rex) bs
instance IsRegex RE LBS.ByteString where
matchOnce = flip (?=~)
matchMany = flip (*=~)
makeRegexWith = \o -> compileRegexWith o . unpackE
makeRegex = compileRegex . unpackE
regexSource = packE . reSource