module Regexdo.Pcre.Replace(
ReplaceCase(..),
Replace_cl(..),
replaceMatch,
defaultReplacer,
getGroup,
Mr
) where
import Data.Array as A
import Data.ByteString
import Prelude as P
import qualified Data.ByteString as B
import qualified Regexdo.Pcre.Option as O
import qualified Text.Regex.Base.RegexLike as R
import Regexdo.Convert
import Regexdo.Pcre.Match
import Regexdo.Pcre.Result
import Regexdo.TypeDo
import Regexdo.TypeRegex
type Mr a = (Match_cl Regex a, Replace_cl' a, Match_opt a)
class Replace_cl' a where
prefix::PosLen -> a -> a
suffix::PosLen -> a -> a
concat'::[a] -> a
len'::a -> Int
toByteString'::a -> ByteString
toA::ByteString -> a
class Replace_cl a where
replace::Mr a =>
[ReplaceCase] -> (Needle a, Replacement a) -> Haystack a -> a
replace cases0 (pat1,repl1) hay0 =
if isUtf8 cases0 then utfFn2
else fn2 (pat2 pat1,repl1) hay0
where fn1 = if P.elem All cases0 then rall else ronce
fn2 = if P.elem All cases0 then rall else ronce
utfFn2 = let res1 = fn1 (pat2 $ toByteString' <$> pat1, toByteString' <$> repl1) $ toByteString' <$> hay0
in toA res1
pat2 pat1 = addOpt pat1 cOpt1
cOpt1 = comp cases0
replaceGroup::Mr a =>
[ReplaceCase] -> (Needle a, GroupReplacer a) -> Haystack a -> a
replaceGroup cases (pat1,repl1) = fn1 (pat2,repl1)
where pat2 = addOpt pat1 cOpt
cOpt = comp cases
fn1 = if P.elem All cases
then rallGroup
else ronceGroup
instance Replace_cl String
instance Replace_cl' String where
prefix pl1 = P.take $ fst pl1
suffix pl1 = P.drop (pos1 + len1)
where pos1 = fst pl1
len1 = snd pl1
concat' = P.concat
toByteString' = toByteString
toA = toString
len' = P.length
instance Replace_cl B.ByteString
instance Replace_cl' B.ByteString where
prefix pl1 = B.take $ fst pl1
suffix pl1 = B.drop (pos1 + len1)
where pos1 = fst pl1
len1 = snd pl1
concat' = B.concat
toByteString' = id
toA = id
len' = B.length
ronce::Mr a =>
(Needle Regex, Replacement a) -> Haystack a -> a
ronce (pat1, Replacement repl1) h1@(Haystack h0) =
let pl2 = do
let m1 = match pat1 h1
poslen m1
in case pl2 of
Nothing -> h0
Just lpl1 -> firstGroup lpl1 (repl1, h0)
rall::Mr a =>
(Needle Regex, Replacement a) -> Haystack a -> a
rall (pat1, Replacement repl1) h1@(Haystack h0) =
let lpl1 = do
let m1 = matchAll pat1 h1
poslen m1::[[PosLen]]
foldFn1 lpl1 acc1 = firstGroup lpl1 (repl1,acc1)
in P.foldr foldFn1 h0 lpl1
firstGroup::(Replace_cl' a) =>
[PosLen] -> (a,a) -> a
firstGroup (pl0:_) r1@(new0,a0) = acc_haystack $ replaceMatch pl0 (new0, acc1)
where acc1 = ReplaceAcc {
acc_haystack = a0,
position_adj = 0
}
defaultReplacer::(Replace_cl' a, R.Extract a) =>
Int
-> (a -> a)
-> GroupReplacer a
defaultReplacer idx0 tweak0 (ma0::MatchArray) acc0 = maybe acc0 fn1 mval1
where pl1 = ma0 A.! idx0 :: (R.MatchOffset, R.MatchLength)
mval1 = getGroup acc0 ma0 idx0
fn1 str1 = replaceMatch pl1 (str2, acc0)
where str2 = tweak0 str1
getGroup::R.Extract a =>
ReplaceAcc a -> MatchArray -> Int -> Maybe a
getGroup acc0 ma0 idx0 = if idx0 >= P.length ma0 then Nothing
else Just val1
where pl1 = ma0 A.! idx0 :: (R.MatchOffset, R.MatchLength)
pl2 = adjustPoslen pl1 acc0
val1 = extract pl2 $ acc_haystack acc0
adjustPoslen::PosLen -> ReplaceAcc a -> PosLen
adjustPoslen (p0,l0) acc0 = (p0 + position_adj acc0, l0)
ronceGroup::Match_cl Regex a =>
(Needle Regex, GroupReplacer a) -> Haystack a -> a
ronceGroup (pat1, repl1) h1@(Haystack h0) =
let m1 = match pat1 h1::Maybe MatchArray
in case m1 of
Nothing -> h0
Just ma1 -> let a1 = ReplaceAcc {
acc_haystack = h0,
position_adj = 0
}
in acc_haystack $ repl1 ma1 a1
rallGroup::Match_cl Regex a =>
(Needle Regex, GroupReplacer a) -> Haystack a -> a
rallGroup (pat1, repl1) h1@(Haystack h0) =
let ma1 = matchAll pat1 h1::[MatchArray]
acc1 = ReplaceAcc { acc_haystack = h0, position_adj = 0 }
in acc_haystack $ P.foldl (flip repl1) acc1 ma1
replaceMatch::Replace_cl' a =>
PosLen
-> (a, ReplaceAcc a)
-> ReplaceAcc a
replaceMatch pl0@(_,l0) (new0, acc0) = ReplaceAcc {
acc_haystack = acc1,
position_adj = position_adj acc0 + l1 l0
}
where pl1 = adjustPoslen pl0 acc0
prefix1 = prefix pl1 $ acc_haystack acc0
suffix1 = suffix pl1 $ acc_haystack acc0
acc1 = concat' [prefix1, new0, suffix1]
l1 = len' new0
addOpt::Match_opt a =>
Needle a -> [O.Comp] -> Needle Regex
addOpt pat1 opt1 = Needle rx1
where rx1 = makeRegexOpts opt1 [] pat1
comp::[ReplaceCase]-> [O.Comp]
comp = P.map mapFn . P.filter filterFn
where filterFn o1 = o1 `P.elem` [Utf8,Multiline]
mapFn Utf8 = O.Utf8
mapFn Multiline = O.Multiline
isUtf8::[ReplaceCase] -> Bool
isUtf8 case0 = Utf8 `P.elem` case0