cabal-debian-5.2: Create a Debianization for a Cabal package
Safe HaskellNone
LanguageHaskell2010

Debian.Debianize.BinaryDebDescription

Synopsis

Documentation

data BinaryDebDescription Source #

This type represents a section of the control file other than the first, which in turn represent one of the binary packages or debs produced by this debianization.

The different types of binary debs we can produce from a haskell package

Instances

Instances details
Eq BinaryDebDescription Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Data BinaryDebDescription Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BinaryDebDescription -> c BinaryDebDescription #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BinaryDebDescription #

toConstr :: BinaryDebDescription -> Constr #

dataTypeOf :: BinaryDebDescription -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BinaryDebDescription) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BinaryDebDescription) #

gmapT :: (forall b. Data b => b -> b) -> BinaryDebDescription -> BinaryDebDescription #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BinaryDebDescription -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BinaryDebDescription -> r #

gmapQ :: (forall d. Data d => d -> u) -> BinaryDebDescription -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BinaryDebDescription -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BinaryDebDescription -> m BinaryDebDescription #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BinaryDebDescription -> m BinaryDebDescription #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BinaryDebDescription -> m BinaryDebDescription #

Ord BinaryDebDescription Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Read BinaryDebDescription Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Show BinaryDebDescription Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Canonical BinaryDebDescription Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Canonical [BinaryDebDescription] Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

data PackageType Source #

Package interrelationship information.

Constructors

Development

The libghc-foo-dev package.

Profiling

The libghc-foo-prof package.

Documentation

The libghc-foo-doc package.

Exec

A package related to a particular executable, perhaps but not necessarily a server.

Utilities

A package that holds the package's data files and any executables not assigned to other packages.

Source

The source package (not a binary deb actually.)

HaskellSource

The source package of a haskell library (add prefix haskell- to source package name.)

Cabal

This is used to construct the value for DEB_CABAL_PACKAGE in the rules file

Instances

Instances details
Eq PackageType Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Data PackageType Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageType -> c PackageType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageType #

toConstr :: PackageType -> Constr #

dataTypeOf :: PackageType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageType) #

gmapT :: (forall b. Data b => b -> b) -> PackageType -> PackageType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageType -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageType -> m PackageType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageType -> m PackageType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageType -> m PackageType #

Ord PackageType Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Read PackageType Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Show PackageType Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

data PackageRelations Source #

Instances

Instances details
Eq PackageRelations Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Data PackageRelations Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageRelations -> c PackageRelations #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageRelations #

toConstr :: PackageRelations -> Constr #

dataTypeOf :: PackageRelations -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageRelations) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageRelations) #

gmapT :: (forall b. Data b => b -> b) -> PackageRelations -> PackageRelations #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageRelations -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageRelations -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageRelations -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageRelations -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageRelations -> m PackageRelations #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageRelations -> m PackageRelations #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageRelations -> m PackageRelations #

Ord PackageRelations Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Read PackageRelations Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Show PackageRelations Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription

Canonical PackageRelations Source # 
Instance details

Defined in Debian.Debianize.BinaryDebDescription