Darcs.Patch.V2.Prim
newtype Prim x y Source #
Constructors
Fields
Defined in Darcs.Patch.V2.Prim
Methods
annotate :: Prim wX wY -> AnnotatedM () Source #
Associated Types
type ApplyState Prim :: (Type -> Type) -> Type Source #
apply :: ApplyMonad (ApplyState Prim) m => Prim wX wY -> m () Source #
unapply :: ApplyMonad (ApplyState Prim) m => Prim wX wY -> m () Source #
commute :: (Prim :> Prim) wX wY -> Maybe ((Prim :> Prim) wX wY) Source #
isHunk :: Prim wX wY -> Maybe (FileHunk (ObjectIdOfPatch Prim) wX wY) Source #
patchListFormat :: ListFormat Prim Source #
listTouchedFiles :: Prim wX wY -> [AnchoredPath] Source #
hunkMatches :: (ByteString -> Bool) -> Prim wX wY -> Bool Source #
invert :: Prim wX wY -> Prim wY wX Source #
cleanMerge :: (Prim :\/: Prim) wX wY -> Maybe ((Prim :/\: Prim) wX wY) Source #
applyPrimFL :: ApplyMonad (ApplyState Prim) m => FL Prim wX wY -> m () Source #
tryToShrink :: FL Prim wX wY -> Maybe (FL Prim wX wY) Source #
sortCoalesceFL :: FL Prim wX wY -> FL Prim wX wY Source #
primCoalesce :: Prim wX wY -> Prim wY wZ -> Maybe (Prim wX wZ) Source #
isIdentity :: Prim wX wY -> EqCheck wX wY Source #
comparePrim :: Prim wA wB -> Prim wC wD -> Ordering Source #
addfile :: AnchoredPath -> Prim wX wY Source #
rmfile :: AnchoredPath -> Prim wX wY Source #
adddir :: AnchoredPath -> Prim wX wY Source #
rmdir :: AnchoredPath -> Prim wX wY Source #
move :: AnchoredPath -> AnchoredPath -> Prim wX wY Source #
changepref :: String -> String -> String -> Prim wX wY Source #
hunk :: AnchoredPath -> Int -> [ByteString] -> [ByteString] -> Prim wX wY Source #
tokreplace :: AnchoredPath -> String -> String -> String -> Prim wX wY Source #
binary :: AnchoredPath -> ByteString -> ByteString -> Prim wX wY Source #
primFromHunk :: FileHunk (ObjectIdOfPatch Prim) wX wY -> Prim wX wY Source #
summarizePrim :: Prim wX wY -> [SummDetail] Source #
mangleUnravelled :: Unravelled Prim wX -> Maybe (Mangled Prim wX) Source #
primIsSiftable :: Prim wX wY -> Bool Source #
readPatch' :: Parser (Sealed (Prim wX)) Source #
applyAndTryToFixFL :: ApplyMonad (ApplyState Prim) m => Prim wX wY -> m (Maybe (String, FL Prim wX wY)) Source #
showPatchWithContextAndApply :: ApplyMonad (ApplyState Prim) m => ShowPatchFor -> Prim wX wY -> m Doc Source #
content :: Prim wX wY -> Doc Source #
description :: Prim wX wY -> Doc Source #
summary :: Prim wX wY -> Doc Source #
summaryFL :: FL Prim wX wY -> Doc Source #
thing :: Prim wX wY -> String Source #
things :: Prim wX wY -> String Source #
showPatch :: ShowPatchFor -> Prim wX wY -> Doc Source #
unsafeCompare :: Prim wA wB -> Prim wC wD -> Bool Source #
(=\/=) :: Prim wA wB -> Prim wA wC -> EqCheck wB wC Source #
(=/\=) :: Prim wA wC -> Prim wB wC -> EqCheck wA wB Source #
showDict2 :: ShowDict (Prim wX wY) Source #
Defined in Darcs.Repository.Job
toPrimV1 :: Prim wX wY -> Prim0 wX wY Source #
showDict1 :: Dict (Show (Prim wX wX0)) Source #
showsPrec :: Int -> Prim x y -> ShowS #
show :: Prim x y -> String #
showList :: [Prim x y] -> ShowS #