darcs-2.1.98.2: a distributed, interactive, smart revision control systemSource codeContentsIndex
Darcs.Patch.Patchy
Documentation
class (Apply p, Commute p, ShowPatch p, ReadPatch p, Invert p) => Patchy p Source
show/hide Instances
class Apply p whereSource
Methods
apply :: WriteableDirectory m => [DarcsFlag] -> p -> m ()Source
applyAndTryToFix :: WriteableDirectory m => p -> m (Maybe (String, p))Source
applyAndTryToFixFL :: WriteableDirectory m => p -> m (Maybe (String, FL p))Source
show/hide Instances
mapMaybeSnd :: (a -> b) -> Maybe (c, a) -> Maybe (c, b)Source
class Commute p whereSource
Methods
commute :: (p :> p) -> Maybe (p :> p)Source
commutex :: (p :< p) -> Maybe (p :< p)Source
merge :: (p :\/: p) -> p :/\: pSource
list_touched_files :: p -> [FilePath]Source
show/hide Instances
commuteFL :: Commute p => (p :> FL p) -> Either (Sealed2 p) (FL p :> p)Source
commuteRL :: Commute p => (RL p :> p) -> Maybe (p :> RL p)Source
commuteRLFL :: Commute p => (RL p :> FL p) -> Maybe (FL p :> RL p)Source
mergeFL :: Commute p => (p :\/: FL p) -> FL p :/\: pSource
class Commute p => ShowPatch p whereSource
Methods
showPatch :: p -> DocSource
showNicely :: p -> DocSource
showContextPatch :: Slurpy -> p -> DocSource
description :: p -> DocSource
summary :: p -> DocSource
writePatch :: FilePath -> p -> IO ()Source
gzWritePatch :: FilePath -> p -> IO ()Source
thing :: p -> StringSource
things :: p -> StringSource
show/hide Instances
class ReadPatch p whereSource
Methods
readPatch' :: ParserM m => Bool -> m (Maybe (Sealed p))Source
show/hide Instances
bracketedFL :: (ReadPatch p, ParserM m) => Word8 -> Word8 -> m (Maybe (Sealed (FL p)))Source
peekfor :: ParserM m => String -> m a -> m a -> m aSource
class MyEq p => Invert p whereSource
Methods
invert :: p -> pSource
identity :: pSource
sloppyIdentity :: p -> EqCheckSource
show/hide Instances
invertFL :: Invert p => FL p -> RL pSource
invertRL :: Invert p => RL p -> FL pSource
Produced by Haddock version 2.4.2