Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data SourceRepo = SourceRepo {}
- data RepoKind
- data RepoType
- knownRepoTypes :: [RepoType]
- emptySourceRepo :: RepoKind -> SourceRepo
- classifyRepoType :: String -> RepoType
- classifyRepoKind :: String -> RepoKind
Documentation
data SourceRepo Source #
Information about the source revision control system for a package.
When specifying a repo it is useful to know the meaning or intention of the
information as doing so enables automation. There are two obvious common
purposes: one is to find the repo for the latest development version, the
other is to find the repo for this specific release. The ReopKind
specifies which one we mean (or another custom one).
A package can specify one or the other kind or both. Most will specify just a head repo but some may want to specify a repo to reconstruct the sources for this package release.
The required information is the RepoType
which tells us if it's using
Darcs
, Git
for example. The repoLocation
and other details are
interpreted according to the repo type.
SourceRepo | |
|
Instances
What this repo info is for, what it represents.
RepoHead | The repository for the "head" or development version of the project. This repo is where we should track the latest development activity or the usual repo people should get to contribute patches. |
RepoThis | The repository containing the sources for this exact package version or release. For this kind of repo a tag should be given to give enough information to re-create the exact sources. |
RepoKindUnknown String |
Instances
Eq RepoKind # | |
Data RepoKind # | |
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepoKind -> c RepoKind Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepoKind Source # toConstr :: RepoKind -> Constr Source # dataTypeOf :: RepoKind -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepoKind) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepoKind) Source # gmapT :: (forall b. Data b => b -> b) -> RepoKind -> RepoKind Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepoKind -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepoKind -> r Source # gmapQ :: (forall d. Data d => d -> u) -> RepoKind -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> RepoKind -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind Source # | |
Ord RepoKind # | |
Read RepoKind # | |
Show RepoKind # | |
Generic RepoKind # | |
NFData RepoKind # | |
Binary RepoKind # | |
Parsec RepoKind # | |
parsec :: CabalParsing m => m RepoKind Source # | |
Pretty RepoKind # | |
Text RepoKind # | |
type Rep RepoKind # | |
type Rep RepoKind = D1 (MetaData "RepoKind" "Distribution.Types.SourceRepo" "Cabal-2.1.0.0" False) (C1 (MetaCons "RepoHead" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "RepoThis" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "RepoKindUnknown" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)))) |
An enumeration of common source control systems. The fields used in the
SourceRepo
depend on the type of repo. The tools and methods used to
obtain and track the repo depend on the repo type.
Instances
Eq RepoType # | |
Data RepoType # | |
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepoType -> c RepoType Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepoType Source # toConstr :: RepoType -> Constr Source # dataTypeOf :: RepoType -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepoType) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepoType) Source # gmapT :: (forall b. Data b => b -> b) -> RepoType -> RepoType Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepoType -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepoType -> r Source # gmapQ :: (forall d. Data d => d -> u) -> RepoType -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> RepoType -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType Source # | |
Ord RepoType # | |
Read RepoType # | |
Show RepoType # | |
Generic RepoType # | |
NFData RepoType # | |
Binary RepoType # | |
Parsec RepoType # | |
parsec :: CabalParsing m => m RepoType Source # | |
Pretty RepoType # | |
Text RepoType # | |
type Rep RepoType # | |
type Rep RepoType = D1 (MetaData "RepoType" "Distribution.Types.SourceRepo" "Cabal-2.1.0.0" False) (((C1 (MetaCons "Darcs" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "Git" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "SVN" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "CVS" PrefixI False) (U1 :: * -> *))) :+: ((C1 (MetaCons "Mercurial" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "GnuArch" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "Bazaar" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "Monotone" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherRepoType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)))))) |
knownRepoTypes :: [RepoType] Source #
emptySourceRepo :: RepoKind -> SourceRepo Source #
classifyRepoType :: String -> RepoType Source #
classifyRepoKind :: String -> RepoKind Source #