module Darcs.Patch.Show
( ShowPatchBasic(..)
, ShowPatch(..)
, showNamedPrefix
, formatFileName
) where
import Prelude ()
import Darcs.Prelude
import Prelude hiding ( pi )
import Darcs.Patch.Apply ( ApplyState )
import Darcs.Patch.ApplyMonad ( ApplyMonad )
import Darcs.Patch.Format ( FileNameFormat(..) )
import Darcs.Patch.Info ( PatchInfo, showPatchInfo )
import Darcs.Patch.Witnesses.Ordered ( FL )
import Darcs.Util.English ( plural, Noun(Noun) )
import Darcs.Util.Path ( FileName, fn2ps, encodeWhite, fn2fp )
import Darcs.Util.Printer ( Doc, vcat, blueText, ($$), text, packedString )
showNamedPrefix :: PatchInfo -> [PatchInfo] -> Doc
showNamedPrefix n d = showPatchInfo n
$$ blueText "<"
$$ vcat (map showPatchInfo d)
$$ blueText ">"
class ShowPatchBasic p where
showPatch :: p wX wY -> Doc
class ShowPatchBasic p => ShowPatch p where
showNicely :: p wX wY -> Doc
showNicely = showPatch
showContextPatch :: (Monad m,
ApplyMonad (ApplyState p) m)
=> p wX wY -> m Doc
showContextPatch p = return $ showPatch p
description :: p wX wY -> Doc
description = showPatch
summary :: p wX wY -> Doc
summaryFL :: FL p wX wY -> Doc
thing :: p wX wY -> String
thing _ = "patch"
things :: p wX wY -> String
things x = plural (Noun $ thing x) ""
formatFileName :: FileNameFormat -> FileName -> Doc
formatFileName OldFormat = packedString . fn2ps
formatFileName NewFormat = text . encodeWhite . fn2fp