Copyright | 2010 Petr Rockai |
---|---|
License | MIT |
Maintainer | darcs-devel@darcs.net |
Stability | experimental |
Portability | portable |
Safe Haskell | Safe-Inferred |
Language | Haskell2010 |
Synopsis
- annotateFile :: AnnotateRP p => RL (PatchInfoAnd p) wX wY -> AnchoredPath -> ByteString -> AnnotateResult
- annotateDirectory :: AnnotateRP p => RL (PatchInfoAnd p) wX wY -> AnchoredPath -> [AnchoredPath] -> AnnotateResult
- format :: ByteString -> AnnotateResult -> String
- machineFormat :: ByteString -> AnnotateResult -> String
- type AnnotateResult = Vector (Maybe PatchInfo, ByteString)
- class Annotate p where
- annotate :: p wX wY -> AnnotatedM ()
- type AnnotateRP p = (Annotate (PrimOf p), Invert (PrimOf p), Effect p)
Documentation
annotateFile :: AnnotateRP p => RL (PatchInfoAnd p) wX wY -> AnchoredPath -> ByteString -> AnnotateResult Source #
annotateDirectory :: AnnotateRP p => RL (PatchInfoAnd p) wX wY -> AnchoredPath -> [AnchoredPath] -> AnnotateResult Source #
format :: ByteString -> AnnotateResult -> String Source #
machineFormat :: ByteString -> AnnotateResult -> String Source #
type AnnotateResult = Vector (Maybe PatchInfo, ByteString) Source #
class Annotate p where Source #
annotate :: p wX wY -> AnnotatedM () Source #
Instances
Annotate Prim Source # | |
Defined in Darcs.Patch.Annotate annotate :: Prim wX wY -> AnnotatedM () Source # | |
Annotate Prim Source # | |
Defined in Darcs.Patch.Annotate annotate :: Prim wX wY -> AnnotatedM () Source # | |
Annotate Prim Source # | |
Defined in Darcs.Patch.V1.Prim annotate :: Prim wX wY -> AnnotatedM () Source # | |
Annotate Prim Source # | |
Defined in Darcs.Patch.V2.Prim annotate :: Prim wX wY -> AnnotatedM () Source # | |
Annotate p => Annotate (PrimWithName name p) Source # | |
Defined in Darcs.Patch.Prim.WithName annotate :: PrimWithName name p wX wY -> AnnotatedM () Source # |
type AnnotateRP p = (Annotate (PrimOf p), Invert (PrimOf p), Effect p) Source #
This constraint expresses what is needed for a repo patch to support the high-level interface to annotation (currently annotateFile and annotateDirectory)