stack-1.5.0: The Haskell Tool Stack

Safe HaskellNone
LanguageHaskell2010

Stack.Types.PackageIndex

Contents

Synopsis

Documentation

data PackageDownload #

Constructors

PackageDownload 

Instances

Eq PackageDownload # 
Data PackageDownload # 

Methods

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

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

toConstr :: PackageDownload -> Constr #

dataTypeOf :: PackageDownload -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PackageDownload # 
Generic PackageDownload # 
FromJSON PackageDownload # 
NFData PackageDownload # 

Methods

rnf :: PackageDownload -> () #

Store PackageDownload # 
type Rep PackageDownload # 
type Rep PackageDownload = D1 (MetaData "PackageDownload" "Stack.Types.PackageIndex" "stack-1.5.0-IuA3bCFJcEEM0Uh3GFmyz" False) (C1 (MetaCons "PackageDownload" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "pdSHA256") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ByteString)) ((:*:) (S1 (MetaSel (Just Symbol "pdUrl") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ByteString)) (S1 (MetaSel (Just Symbol "pdSize") NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 Word64)))))

newtype HSPackageDownload #

Hackage Security provides a different JSON format, we'll have our own JSON parser for it.

data PackageCache #

Instances

Eq PackageCache # 
Data PackageCache # 

Methods

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

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

toConstr :: PackageCache -> Constr #

dataTypeOf :: PackageCache -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PackageCache # 
Generic PackageCache # 

Associated Types

type Rep PackageCache :: * -> * #

NFData PackageCache # 

Methods

rnf :: PackageCache -> () #

Store PackageCache # 
type Rep PackageCache # 
type Rep PackageCache = D1 (MetaData "PackageCache" "Stack.Types.PackageIndex" "stack-1.5.0-IuA3bCFJcEEM0Uh3GFmyz" False) (C1 (MetaCons "PackageCache" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "pcOffsetSize") SourceUnpack SourceStrict DecidedUnpack) (Rec0 OffsetSize)) (S1 (MetaSel (Just Symbol "pcDownload") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PackageDownload)))))

data PackageCacheMap #

Constructors

PackageCacheMap 

Fields

Instances

Eq PackageCacheMap # 
Data PackageCacheMap # 

Methods

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

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

toConstr :: PackageCacheMap -> Constr #

dataTypeOf :: PackageCacheMap -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PackageCacheMap # 
Generic PackageCacheMap # 
NFData PackageCacheMap # 

Methods

rnf :: PackageCacheMap -> () #

Store PackageCacheMap # 
type Rep PackageCacheMap # 
type Rep PackageCacheMap = D1 (MetaData "PackageCacheMap" "Stack.Types.PackageIndex" "stack-1.5.0-IuA3bCFJcEEM0Uh3GFmyz" False) (C1 (MetaCons "PackageCacheMap" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "pcmIdent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Map PackageIdentifier PackageCache))) (S1 (MetaSel (Just Symbol "pcmSHA") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (HashMap GitSHA1 OffsetSize)))))

data OffsetSize #

offset in bytes into the 01-index.tar file for the .cabal file contents, and size in bytes of the .cabal file

Constructors

OffsetSize !Int64 !Int64 

Instances

Eq OffsetSize # 
Data OffsetSize # 

Methods

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

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

toConstr :: OffsetSize -> Constr #

dataTypeOf :: OffsetSize -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OffsetSize # 
Generic OffsetSize # 

Associated Types

type Rep OffsetSize :: * -> * #

NFData OffsetSize # 

Methods

rnf :: OffsetSize -> () #

Store OffsetSize # 
type Rep OffsetSize # 
type Rep OffsetSize = D1 (MetaData "OffsetSize" "Stack.Types.PackageIndex" "stack-1.5.0-IuA3bCFJcEEM0Uh3GFmyz" False) (C1 (MetaCons "OffsetSize" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 Int64)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 Int64))))

PackageIndex, IndexName & IndexLocation

data PackageIndex #

Information on a single package index

Constructors

PackageIndex 

Fields