darcs-2.4.4: a distributed, interactive, smart revision control system

Darcs.Patch.Patchy

Synopsis

Documentation

class (Apply p, Commute p, ShowPatch p, ReadPatch p, Invert p) => Patchy p Source

Instances

mapMaybeSnd :: (a -> b) -> Maybe (c, a) -> Maybe (c, b)Source

class Commute p whereSource

Things that can commute.

Methods

commute :: (p :> p) -> Maybe (p :> p)Source

merge :: (p :\/: p) -> p :/\: pSource

listTouchedFiles :: p -> [FilePath]Source

hunkMatches :: (ByteString -> Bool) -> p -> BoolSource

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

toFwdCommute :: (Commute p, Commute q, Monad m) => ((p :< q) -> m (q :< p)) -> (q :> p) -> m (p :> q)Source

Swaps the ordered pair type so that commute can be called directly.

toRevCommute :: (Commute p, Commute q, Monad m) => ((p :> q) -> m (q :> p)) -> (q :< p) -> m (p :< q)Source

Swaps the ordered pair type from the order expected by commute to the reverse order.

peekfor :: ParserM m => String -> m a -> m a -> m aSource

class MyEq p => Invert p whereSource

Instances

Invert Prim 
Invert Patch 
Invert RealPatch 
(Commute p, Invert p) => Invert (RL p) 
(Invert p, Commute p) => Invert (FL p) 
Invert p => Invert (Named p) 
Invert p => Invert (PatchInfoAnd p) 
Invert p => Invert (PatchChoice p) 
Invert p => Invert (TaggedPatch p) 

invertFL :: Invert p => FL p -> RL pSource

invertRL :: Invert p => RL p -> FL pSource