darcs-2.16.2: a distributed, interactive, smart revision control system
Darcs.Patch.V2.Prim
newtype Prim x y Source #
Constructors
Fields
Defined in Darcs.Patch.V2.Prim
Methods
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 #
patchListFormat :: ListFormat Prim Source #
showDict2 :: ShowDict (Prim wX wY) Source #
invert :: Prim wX wY -> Prim wY wX Source #
commute :: (Prim :> Prim) wX wY -> Maybe ((Prim :> Prim) wX wY) Source #
cleanMerge :: (Prim :\/: Prim) wX wY -> Maybe ((Prim :/\: Prim) wX wY) Source #
listTouchedFiles :: Prim wX wY -> [AnchoredPath] Source #
hunkMatches :: (ByteString -> Bool) -> Prim wX wY -> Bool 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 #
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 #
showContextPatch :: ApplyMonad (ApplyState Prim) m => ShowPatchFor -> Prim wX wY -> m Doc Source #
showPatch :: ShowPatchFor -> Prim wX wY -> Doc Source #
isHunk :: Prim wX wY -> Maybe (FileHunk wX wY) Source #
readPatch' :: Parser (Sealed (Prim wX)) Source #
applyAndTryToFixFL :: ApplyMonad (ApplyState Prim) m => Prim wX wY -> m (Maybe (String, FL Prim wX wY)) Source #
mangleUnravelled :: Unravelled Prim wX -> Maybe (Mangled Prim wX) Source #
applyPrimFL :: ApplyMonad (ApplyState Prim) m => FL Prim wX wY -> m () Source #
summarizePrim :: Prim wX wY -> [SummDetail] Source #
siftForPending :: FL Prim wX wY -> Sealed (FL Prim wX) Source #
tryToShrink :: FL Prim wX wY -> FL Prim wX wY Source #
sortCoalesceFL :: FL Prim wX wY -> FL Prim wX wY Source #
canonize :: DiffAlgorithm -> Prim wX wY -> FL Prim wX wY Source #
canonizeFL :: DiffAlgorithm -> FL Prim wX wY -> FL Prim wX wY Source #
coalesce :: (Prim :> Prim) wX wY -> Maybe (FL Prim wX wY) Source #
primCoalesce :: Prim wX wY -> Prim wY wZ -> Maybe (Prim wX wZ) Source #
primDecoalesce :: Prim wX wZ -> Prim wX wY -> Maybe (Prim wY wZ) 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 wX wY -> Prim wX wY Source #
primIsAddfile :: Prim wX wY -> Bool Source #
primIsRmfile :: Prim wX wY -> Bool Source #
primIsAdddir :: Prim wX wY -> Bool Source #
primIsRmdir :: Prim wX wY -> Bool Source #
primIsMove :: Prim wX wY -> Bool Source #
primIsHunk :: Prim wX wY -> Bool Source #
primIsTokReplace :: Prim wX wY -> Bool Source #
primIsBinary :: Prim wX wY -> Bool Source #
primIsSetpref :: Prim wX wY -> Bool Source #
is_filepatch :: Prim wX wY -> Maybe AnchoredPath Source #
annotate :: Prim wX wY -> AnnotatedM () 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 #