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

Safe HaskellNone
LanguageHaskell2010

Darcs.UI.ApplyPatches

Synopsis

Documentation

class PatchApplier pa where Source #

This class is a hack to abstract over pullapply and rebase pullapply.

Minimal complete definition

repoJob, applyPatches

Associated Types

type ApplierRepoTypeConstraint pa (rt :: RepoType) :: Constraint Source #

Methods

repoJob :: pa -> [DarcsFlag] -> (forall rt p wR wU. (IsRepoType rt, ApplierRepoTypeConstraint pa rt, RepoPatch p, ApplyState p ~ Tree) => PatchProxy p -> Repository rt p wR wU wR -> IO ()) -> RepoJob () Source #

applyPatches :: forall rt p wR wU wT wX wZ. (ApplierRepoTypeConstraint pa rt, IsRepoType rt, RepoPatch p, ApplyState p ~ Tree) => pa -> PatchProxy p -> String -> [DarcsFlag] -> String -> Repository rt p wR wU wT -> FL (PatchInfoAnd rt p) wX wT -> FL (PatchInfoAnd rt p) wX wZ -> IO () Source #

Instances

PatchApplier StandardPatchApplier Source # 

Methods

repoJob :: StandardPatchApplier -> [DarcsFlag] -> (forall (rt :: RepoType) (p :: * -> * -> *) wR wU. (IsRepoType rt, ApplierRepoTypeConstraint StandardPatchApplier rt, RepoPatch p, (((* -> *) -> *) ~ ApplyState p) Tree) => PatchProxy p -> Repository rt p wR wU wR -> IO ()) -> RepoJob () Source #

applyPatches :: (ApplierRepoTypeConstraint StandardPatchApplier rt, IsRepoType rt, RepoPatch p, (((* -> *) -> *) ~ ApplyState p) Tree) => StandardPatchApplier -> PatchProxy p -> String -> [DarcsFlag] -> String -> Repository rt p wR wU wT -> FL (PatchInfoAnd rt p) wX wT -> FL (PatchInfoAnd rt p) wX wZ -> IO () Source #

data PatchProxy (p :: * -> * -> *) Source #

Constructors

PatchProxy