hpack-convert-0.14.4: Convert Cabal manifests into hpack's package.yamls

Safe HaskellNone
LanguageHaskell2010

Hpack.Config

Documentation

data Package Source #

Instances

Eq Package Source # 

Methods

(==) :: Package -> Package -> Bool #

(/=) :: Package -> Package -> Bool #

Show Package Source # 
Generic Package Source # 

Associated Types

type Rep Package :: * -> * #

Methods

from :: Package -> Rep Package x #

to :: Rep Package x -> Package #

ToJSON Package Source # 
type Rep Package Source # 
type Rep Package = D1 (MetaData "Package" "Hpack.Config" "hpack-convert-0.14.4-Fl70iUa08Uv7dEZC9QYBUW" False) (C1 (MetaCons "Package" PrefixI True) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "packageName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) (S1 (MetaSel (Just Symbol "packageVersion") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String))) ((:*:) (S1 (MetaSel (Just Symbol "packageSynopsis") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String))) ((:*:) (S1 (MetaSel (Just Symbol "packageDescription") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String))) (S1 (MetaSel (Just Symbol "packageHomepage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "packageBugReports") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String))) ((:*:) (S1 (MetaSel (Just Symbol "packageCategory") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String))) (S1 (MetaSel (Just Symbol "packageStability") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String))))) ((:*:) (S1 (MetaSel (Just Symbol "packageAuthor") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String])) ((:*:) (S1 (MetaSel (Just Symbol "packageMaintainer") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String])) (S1 (MetaSel (Just Symbol "packageCopyright") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String])))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "packageLicense") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String))) (S1 (MetaSel (Just Symbol "packageLicenseFile") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe FilePath)))) ((:*:) (S1 (MetaSel (Just Symbol "packageTestedWith") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String))) ((:*:) (S1 (MetaSel (Just Symbol "packageFlags") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Flag])) (S1 (MetaSel (Just Symbol "packageExtraSourceFiles") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath]))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "packageDataFiles") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath])) ((:*:) (S1 (MetaSel (Just Symbol "packageSourceRepository") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe SourceRepository))) (S1 (MetaSel (Just Symbol "packageLibrary") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Section Library)))))) ((:*:) (S1 (MetaSel (Just Symbol "packageExecutables") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Section Executable])) ((:*:) (S1 (MetaSel (Just Symbol "packageTests") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Section Executable])) (S1 (MetaSel (Just Symbol "packageBenchmarks") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Section Executable]))))))))

data Dependency Source #

data AddSource Source #

data Section a Source #

Instances

Functor Section Source # 

Methods

fmap :: (a -> b) -> Section a -> Section b #

(<$) :: a -> Section b -> Section a #

Foldable Section Source # 

Methods

fold :: Monoid m => Section m -> m #

foldMap :: Monoid m => (a -> m) -> Section a -> m #

foldr :: (a -> b -> b) -> b -> Section a -> b #

foldr' :: (a -> b -> b) -> b -> Section a -> b #

foldl :: (b -> a -> b) -> b -> Section a -> b #

foldl' :: (b -> a -> b) -> b -> Section a -> b #

foldr1 :: (a -> a -> a) -> Section a -> a #

foldl1 :: (a -> a -> a) -> Section a -> a #

toList :: Section a -> [a] #

null :: Section a -> Bool #

length :: Section a -> Int #

elem :: Eq a => a -> Section a -> Bool #

maximum :: Ord a => Section a -> a #

minimum :: Ord a => Section a -> a #

sum :: Num a => Section a -> a #

product :: Num a => Section a -> a #

Traversable Section Source # 

Methods

traverse :: Applicative f => (a -> f b) -> Section a -> f (Section b) #

sequenceA :: Applicative f => Section (f a) -> f (Section a) #

mapM :: Monad m => (a -> m b) -> Section a -> m (Section b) #

sequence :: Monad m => Section (m a) -> m (Section a) #

Eq a => Eq (Section a) Source # 

Methods

(==) :: Section a -> Section a -> Bool #

(/=) :: Section a -> Section a -> Bool #

Show a => Show (Section a) Source # 

Methods

showsPrec :: Int -> Section a -> ShowS #

show :: Section a -> String #

showList :: [Section a] -> ShowS #

Generic (Section a) Source # 

Associated Types

type Rep (Section a) :: * -> * #

Methods

from :: Section a -> Rep (Section a) x #

to :: Rep (Section a) x -> Section a #

ToJSON [Section Executable] Source # 
ToJSON (Section ()) Source # 

Methods

toJSON :: Section () -> Value #

toEncoding :: Section () -> Encoding #

(Generic (Section a), GToJSON (Rep (Section a)), HasTypeName * (Section a), ToJSON a) => ToJSON (Section a) Source # 
type Rep (Section a) Source # 
type Rep (Section a)

data Library Source #

Instances

Eq Library Source # 

Methods

(==) :: Library -> Library -> Bool #

(/=) :: Library -> Library -> Bool #

Show Library Source # 
Generic Library Source # 

Associated Types

type Rep Library :: * -> * #

Methods

from :: Library -> Rep Library x #

to :: Rep Library x -> Library #

ToJSON Library Source # 
type Rep Library Source # 
type Rep Library = D1 (MetaData "Library" "Hpack.Config" "hpack-convert-0.14.4-Fl70iUa08Uv7dEZC9QYBUW" False) (C1 (MetaCons "Library" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "libraryExposed") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "libraryExposedModules") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String]))) ((:*:) (S1 (MetaSel (Just Symbol "libraryOtherModules") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String])) (S1 (MetaSel (Just Symbol "libraryReexportedModules") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String])))))

data Flag Source #

Instances

Eq Flag Source # 

Methods

(==) :: Flag -> Flag -> Bool #

(/=) :: Flag -> Flag -> Bool #

Show Flag Source # 

Methods

showsPrec :: Int -> Flag -> ShowS #

show :: Flag -> String #

showList :: [Flag] -> ShowS #

Generic Flag Source # 

Associated Types

type Rep Flag :: * -> * #

Methods

from :: Flag -> Rep Flag x #

to :: Rep Flag x -> Flag #

ToJSON [Flag] Source # 

Methods

toJSON :: [Flag] -> Value #

toEncoding :: [Flag] -> Encoding #

type Rep Flag Source #