stack-1.5.1: The Haskell Tool Stack

Safe HaskellNone
LanguageHaskell2010

Stack.Types.PackageIndex

Contents

Synopsis

Documentation

data PackageDownload Source #

Constructors

PackageDownload 

Instances

Eq PackageDownload Source # 
Data PackageDownload Source # 

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 Source # 
Generic PackageDownload Source # 
FromJSON PackageDownload Source # 
NFData PackageDownload Source # 

Methods

rnf :: PackageDownload -> () #

Store PackageDownload Source # 
type Rep PackageDownload Source # 
type Rep PackageDownload = D1 (MetaData "PackageDownload" "Stack.Types.PackageIndex" "stack-1.5.1-5e9OdzxbAr7JlXF5YdN55t" 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 DecidedStrict) (Rec0 Word64)))))

newtype HSPackageDownload Source #

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

data PackageCache Source #

Instances

Eq PackageCache Source # 
Data PackageCache Source # 

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 Source # 
Generic PackageCache Source # 

Associated Types

type Rep PackageCache :: * -> * #

NFData PackageCache Source # 

Methods

rnf :: PackageCache -> () #

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

data PackageCacheMap Source #

Constructors

PackageCacheMap 

Fields

Instances

Eq PackageCacheMap Source # 
Data PackageCacheMap Source # 

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 Source # 
Generic PackageCacheMap Source # 
NFData PackageCacheMap Source # 

Methods

rnf :: PackageCacheMap -> () #

Store PackageCacheMap Source # 
type Rep PackageCacheMap Source # 
type Rep PackageCacheMap = D1 (MetaData "PackageCacheMap" "Stack.Types.PackageIndex" "stack-1.5.1-5e9OdzxbAr7JlXF5YdN55t" 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 Source #

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 Source # 
Data OffsetSize Source # 

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 Source # 
Generic OffsetSize Source # 

Associated Types

type Rep OffsetSize :: * -> * #

NFData OffsetSize Source # 

Methods

rnf :: OffsetSize -> () #

Store OffsetSize Source # 
type Rep OffsetSize Source # 
type Rep OffsetSize = D1 (MetaData "OffsetSize" "Stack.Types.PackageIndex" "stack-1.5.1-5e9OdzxbAr7JlXF5YdN55t" False) (C1 (MetaCons "OffsetSize" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Int64)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Int64))))

PackageIndex, IndexName & IndexLocation

data PackageIndex Source #

Information on a single package index

Constructors

PackageIndex 

Fields