module Darcs.Patch.Format
( PatchListFormat(..)
, ListFormat(..)
, FileNameFormat(..)
) where
import Darcs.Prelude
class PatchListFormat p where
patchListFormat :: ListFormat p
patchListFormat = ListFormat p
forall (p :: * -> * -> *). ListFormat p
ListFormatDefault
data ListFormat (p :: (* -> * -> *))
= ListFormatDefault
| ListFormatV1
| ListFormatV2
| ListFormatV3
data FileNameFormat
= FileNameFormatV1
| FileNameFormatV2
| FileNameFormatDisplay
deriving (FileNameFormat -> FileNameFormat -> Bool
(FileNameFormat -> FileNameFormat -> Bool)
-> (FileNameFormat -> FileNameFormat -> Bool) -> Eq FileNameFormat
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: FileNameFormat -> FileNameFormat -> Bool
== :: FileNameFormat -> FileNameFormat -> Bool
$c/= :: FileNameFormat -> FileNameFormat -> Bool
/= :: FileNameFormat -> FileNameFormat -> Bool
Eq, Int -> FileNameFormat -> ShowS
[FileNameFormat] -> ShowS
FileNameFormat -> String
(Int -> FileNameFormat -> ShowS)
-> (FileNameFormat -> String)
-> ([FileNameFormat] -> ShowS)
-> Show FileNameFormat
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> FileNameFormat -> ShowS
showsPrec :: Int -> FileNameFormat -> ShowS
$cshow :: FileNameFormat -> String
show :: FileNameFormat -> String
$cshowList :: [FileNameFormat] -> ShowS
showList :: [FileNameFormat] -> ShowS
Show)