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

Safe HaskellNone
LanguageHaskell2010

Darcs.Patch.Prim.V1.Core

Synopsis

Documentation

data Prim wX wY where Source #

Constructors

Move :: !FileName -> !FileName -> Prim wX wY 
DP :: !FileName -> !(DirPatchType wX wY) -> Prim wX wY 
FP :: !FileName -> !(FilePatchType wX wY) -> Prim wX wY 
ChangePref :: !String -> !String -> !String -> Prim wX wY 

Instances

MyEq Prim Source # 

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 #

PatchDebug Prim Source # 

Methods

patchDebugDummy :: Prim wX wY -> () Source #

PatchInspect Prim Source # 

Methods

listTouchedFiles :: Prim wX wY -> [FilePath] Source #

hunkMatches :: (ByteString -> Bool) -> Prim wX wY -> Bool Source #

Invert Prim Source # 

Methods

invert :: Prim wX wY -> Prim wY wX Source #

IsHunk Prim Source # 

Methods

isHunk :: Prim wX wY -> Maybe (FileHunk wX wY) Source #

PrimConstruct Prim Source # 
PrimClassify Prim Source # 
Eq (Prim wX wY) Source # 

Methods

(==) :: Prim wX wY -> Prim wX wY -> Bool #

(/=) :: Prim wX wY -> Prim wX wY -> Bool #

type ApplyState Prim Source # 
type PrimOf Prim Source # 

data DirPatchType wX wY Source #

Constructors

RmDir 
AddDir 

Instances

MyEq DirPatchType Source # 

Methods

unsafeCompare :: DirPatchType wA wB -> DirPatchType wC wD -> Bool Source #

(=\/=) :: DirPatchType wA wB -> DirPatchType wA wC -> EqCheck wB wC Source #

(=/\=) :: DirPatchType wA wC -> DirPatchType wB wC -> EqCheck wA wB Source #

Eq (DirPatchType wX wY) Source # 

Methods

(==) :: DirPatchType wX wY -> DirPatchType wX wY -> Bool #

(/=) :: DirPatchType wX wY -> DirPatchType wX wY -> Bool #

Ord (DirPatchType wX wY) Source # 

Methods

compare :: DirPatchType wX wY -> DirPatchType wX wY -> Ordering #

(<) :: DirPatchType wX wY -> DirPatchType wX wY -> Bool #

(<=) :: DirPatchType wX wY -> DirPatchType wX wY -> Bool #

(>) :: DirPatchType wX wY -> DirPatchType wX wY -> Bool #

(>=) :: DirPatchType wX wY -> DirPatchType wX wY -> Bool #

max :: DirPatchType wX wY -> DirPatchType wX wY -> DirPatchType wX wY #

min :: DirPatchType wX wY -> DirPatchType wX wY -> DirPatchType wX wY #

data FilePatchType wX wY Source #

Instances

MyEq FilePatchType Source # 

Methods

unsafeCompare :: FilePatchType wA wB -> FilePatchType wC wD -> Bool Source #

(=\/=) :: FilePatchType wA wB -> FilePatchType wA wC -> EqCheck wB wC Source #

(=/\=) :: FilePatchType wA wC -> FilePatchType wB wC -> EqCheck wA wB Source #

Eq (FilePatchType wX wY) Source # 

Methods

(==) :: FilePatchType wX wY -> FilePatchType wX wY -> Bool #

(/=) :: FilePatchType wX wY -> FilePatchType wX wY -> Bool #

Ord (FilePatchType wX wY) Source # 

Methods

compare :: FilePatchType wX wY -> FilePatchType wX wY -> Ordering #

(<) :: FilePatchType wX wY -> FilePatchType wX wY -> Bool #

(<=) :: FilePatchType wX wY -> FilePatchType wX wY -> Bool #

(>) :: FilePatchType wX wY -> FilePatchType wX wY -> Bool #

(>=) :: FilePatchType wX wY -> FilePatchType wX wY -> Bool #

max :: FilePatchType wX wY -> FilePatchType wX wY -> FilePatchType wX wY #

min :: FilePatchType wX wY -> FilePatchType wX wY -> FilePatchType wX wY #

isIdentity :: Prim wX wY -> EqCheck wX wY Source #

comparePrim :: Prim wX wY -> Prim wW wZ -> Ordering Source #

comparePrim p1 p2 is used to provide an arbitrary ordering between p1 and p2. Basically, identical patches are equal and Move < DP < FP < ChangePref. Everything else is compared in dictionary order of its arguments.