#if __GLASGOW_HASKELL__ >= 800
#endif
module Text.RE.PCRE.ByteString.Lazy
(
(*=~)
, (?=~)
, (=~)
, (=~~)
, module Text.RE
, module Text.RE.PCRE.RE
) where
import Prelude.Compat
import qualified Data.ByteString.Lazy as LBS
import Data.Typeable
import Text.Regex.Base
import Text.RE
import Text.RE.Internal.AddCaptureNames
import Text.RE.PCRE.RE
import qualified Text.Regex.PCRE as PCRE
(*=~) :: 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 PCRE.Regex LBS.ByteString a
, RegexMaker PCRE.Regex PCRE.CompOption PCRE.ExecOption String
)
=> LBS.ByteString
-> RE
-> a
(=~) bs rex = addCaptureNames (reCaptureNames rex) $ match (reRegex rex) bs
(=~~) :: ( Monad m
, Functor m
, Typeable a
, RegexContext PCRE.Regex LBS.ByteString a
, RegexMaker PCRE.Regex PCRE.CompOption PCRE.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 (*=~)
regexSource = reSource