| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
Darcs.Repository.Resolution
Synopsis
- standardResolution :: RepoPatch p => RL (PatchInfoAnd p) wO wX -> RL (PatchInfoAnd p) wX wY -> StandardResolution (PrimOf p) wY
- rebaseResolution :: (Conflict p, PrimPatch (PrimOf p)) => RL (PatchInfoAnd p) wO wX -> RL (Named p) wX wY -> StandardResolution (PrimOf p) wY
- externalResolution :: forall p wX wY wZ wA. (RepoPatch p, ApplyState p ~ Tree) => DiffAlgorithm -> Tree IO -> String -> WantGuiPause -> FL (PrimOf p) wX wY -> FL (PrimOf p) wX wZ -> FL p wY wA -> IO (Sealed (FL (PrimOf p) wA))
- patchsetConflictResolutions :: RepoPatch p => PatchSet p Origin wX -> StandardResolution (PrimOf p) wX
- data StandardResolution prim wX = StandardResolution {
- mangled :: Mangled prim wX
- unmangled :: [Unravelled prim wX]
- conflictedPaths :: [AnchoredPath]
- announceConflicts :: PrimPatch prim => String -> AllowConflicts -> StandardResolution prim wX -> IO Bool
- haveConflicts :: StandardResolution prim wX -> Bool
- warnUnmangled :: PrimPatch prim => Maybe [AnchoredPath] -> StandardResolution prim wX -> IO ()
- showUnmangled :: PrimPatch prim => Maybe [AnchoredPath] -> [Unravelled prim wX] -> Doc
- showUnravelled :: PrimPatch prim => Doc -> Unravelled prim wX -> Doc
Documentation
standardResolution :: RepoPatch p => RL (PatchInfoAnd p) wO wX -> RL (PatchInfoAnd p) wX wY -> StandardResolution (PrimOf p) wY Source #
rebaseResolution :: (Conflict p, PrimPatch (PrimOf p)) => RL (PatchInfoAnd p) wO wX -> RL (Named p) wX wY -> StandardResolution (PrimOf p) wY Source #
Like standardResolution but it doesn't use the instance (Named p)
because the traling list of patches may contain "fake" conflictors.
Arguments
| :: forall p wX wY wZ wA. (RepoPatch p, ApplyState p ~ Tree) | |
| => DiffAlgorithm | |
| -> Tree IO | working tree |
| -> String | external merge tool command |
| -> WantGuiPause | tell whether we want GUI pause |
| -> FL (PrimOf p) wX wY | our effect |
| -> FL (PrimOf p) wX wZ | their effect |
| -> FL p wY wA | them merged |
| -> IO (Sealed (FL (PrimOf p) wA)) |
patchsetConflictResolutions :: RepoPatch p => PatchSet p Origin wX -> StandardResolution (PrimOf p) wX Source #
data StandardResolution prim wX Source #
Constructors
| StandardResolution | |
Fields
| |
announceConflicts :: PrimPatch prim => String -> AllowConflicts -> StandardResolution prim wX -> IO Bool Source #
haveConflicts :: StandardResolution prim wX -> Bool Source #
warnUnmangled :: PrimPatch prim => Maybe [AnchoredPath] -> StandardResolution prim wX -> IO () Source #
showUnmangled :: PrimPatch prim => Maybe [AnchoredPath] -> [Unravelled prim wX] -> Doc Source #
showUnravelled :: PrimPatch prim => Doc -> Unravelled prim wX -> Doc Source #