amazonka-cost-explorer-1.6.0: Amazon Cost Explorer Service SDK.

Copyright(c) 2013-2018 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay+amazonka@gmail.com>
Stabilityauto-generated
Portabilitynon-portable (GHC extensions)
Safe HaskellNone
LanguageHaskell2010

Network.AWS.CostExplorer.Types

Contents

Description

 

Synopsis

Service Configuration

costExplorer :: Service Source #

API version 2017-10-25 of the Amazon Cost Explorer Service SDK configuration.

Errors

_BillExpirationException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The requested report expired. Update the date interval and try again.

_RequestChangedException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Your request parameters changed between pages. Try again with the old parameters or without a pagination token.

_InvalidNextTokenException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The pagination token is invalid. Try again without a pagination token.

_DataUnavailableException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The requested data is unavailable.

_LimitExceededException :: AsError a => Getting (First ServiceError) a ServiceError Source #

You made too many calls in a short period of time. Try again later.

AccountScope

data AccountScope Source #

Constructors

Payer 

Instances

Bounded AccountScope Source # 
Enum AccountScope Source # 
Eq AccountScope Source # 
Data AccountScope Source # 

Methods

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

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

toConstr :: AccountScope -> Constr #

dataTypeOf :: AccountScope -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord AccountScope Source # 
Read AccountScope Source # 
Show AccountScope Source # 
Generic AccountScope Source # 

Associated Types

type Rep AccountScope :: * -> * #

Hashable AccountScope Source # 
ToJSON AccountScope Source # 
FromJSON AccountScope Source # 
NFData AccountScope Source # 

Methods

rnf :: AccountScope -> () #

ToHeader AccountScope Source # 
ToQuery AccountScope Source # 
ToByteString AccountScope Source # 
FromText AccountScope Source # 
ToText AccountScope Source # 

Methods

toText :: AccountScope -> Text #

type Rep AccountScope Source # 
type Rep AccountScope = D1 * (MetaData "AccountScope" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "Payer" PrefixI False) (U1 *))

Context

data Context Source #

Constructors

CostAndUsage 
Reservations 

Instances

Bounded Context Source # 
Enum Context Source # 
Eq Context Source # 

Methods

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

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

Data Context Source # 

Methods

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

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

toConstr :: Context -> Constr #

dataTypeOf :: Context -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Context Source # 
Read Context Source # 
Show Context Source # 
Generic Context Source # 

Associated Types

type Rep Context :: * -> * #

Methods

from :: Context -> Rep Context x #

to :: Rep Context x -> Context #

Hashable Context Source # 

Methods

hashWithSalt :: Int -> Context -> Int #

hash :: Context -> Int #

ToJSON Context Source # 
NFData Context Source # 

Methods

rnf :: Context -> () #

ToHeader Context Source # 

Methods

toHeader :: HeaderName -> Context -> [Header] #

ToQuery Context Source # 
ToByteString Context Source # 

Methods

toBS :: Context -> ByteString #

FromText Context Source # 
ToText Context Source # 

Methods

toText :: Context -> Text #

type Rep Context Source # 
type Rep Context = D1 * (MetaData "Context" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) ((:+:) * (C1 * (MetaCons "CostAndUsage" PrefixI False) (U1 *)) (C1 * (MetaCons "Reservations" PrefixI False) (U1 *)))

Dimension

data Dimension Source #

Instances

Bounded Dimension Source # 
Enum Dimension Source # 
Eq Dimension Source # 
Data Dimension Source # 

Methods

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

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

toConstr :: Dimension -> Constr #

dataTypeOf :: Dimension -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Dimension Source # 
Read Dimension Source # 
Show Dimension Source # 
Generic Dimension Source # 

Associated Types

type Rep Dimension :: * -> * #

Hashable Dimension Source # 
ToJSON Dimension Source # 
NFData Dimension Source # 

Methods

rnf :: Dimension -> () #

ToHeader Dimension Source # 
ToQuery Dimension Source # 
ToByteString Dimension Source # 

Methods

toBS :: Dimension -> ByteString #

FromText Dimension Source # 
ToText Dimension Source # 

Methods

toText :: Dimension -> Text #

type Rep Dimension Source # 
type Rep Dimension = D1 * (MetaData "Dimension" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) ((:+:) * ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "DimensionAZ" PrefixI False) (U1 *)) (C1 * (MetaCons "DimensionCacheEngine" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "DimensionDatabaseEngine" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "DimensionDeploymentOption" PrefixI False) (U1 *)) (C1 * (MetaCons "DimensionInstanceType" PrefixI False) (U1 *))))) ((:+:) * ((:+:) * (C1 * (MetaCons "DimensionInstanceTypeFamily" PrefixI False) (U1 *)) (C1 * (MetaCons "DimensionLegalEntityName" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "DimensionLinkedAccount" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "DimensionOperatingSystem" PrefixI False) (U1 *)) (C1 * (MetaCons "DimensionOperation" PrefixI False) (U1 *)))))) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "DimensionPlatform" PrefixI False) (U1 *)) (C1 * (MetaCons "DimensionPurchaseType" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "DimensionRecordType" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "DimensionRegion" PrefixI False) (U1 *)) (C1 * (MetaCons "DimensionScope" PrefixI False) (U1 *))))) ((:+:) * ((:+:) * (C1 * (MetaCons "DimensionService" PrefixI False) (U1 *)) (C1 * (MetaCons "DimensionSubscriptionId" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "DimensionTenancy" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "DimensionUsageType" PrefixI False) (U1 *)) (C1 * (MetaCons "DimensionUsageTypeGroup" PrefixI False) (U1 *)))))))

Granularity

data Granularity Source #

Constructors

Daily 
Monthly 

Instances

Bounded Granularity Source # 
Enum Granularity Source # 
Eq Granularity Source # 
Data Granularity Source # 

Methods

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

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

toConstr :: Granularity -> Constr #

dataTypeOf :: Granularity -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Granularity Source # 
Read Granularity Source # 
Show Granularity Source # 
Generic Granularity Source # 

Associated Types

type Rep Granularity :: * -> * #

Hashable Granularity Source # 
ToJSON Granularity Source # 
NFData Granularity Source # 

Methods

rnf :: Granularity -> () #

ToHeader Granularity Source # 
ToQuery Granularity Source # 
ToByteString Granularity Source # 
FromText Granularity Source # 
ToText Granularity Source # 

Methods

toText :: Granularity -> Text #

type Rep Granularity Source # 
type Rep Granularity = D1 * (MetaData "Granularity" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) ((:+:) * (C1 * (MetaCons "Daily" PrefixI False) (U1 *)) (C1 * (MetaCons "Monthly" PrefixI False) (U1 *)))

GroupDefinitionType

data GroupDefinitionType Source #

Constructors

Dimension 
Tag 

Instances

Bounded GroupDefinitionType Source # 
Enum GroupDefinitionType Source # 
Eq GroupDefinitionType Source # 
Data GroupDefinitionType Source # 

Methods

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

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

toConstr :: GroupDefinitionType -> Constr #

dataTypeOf :: GroupDefinitionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GroupDefinitionType Source # 
Read GroupDefinitionType Source # 
Show GroupDefinitionType Source # 
Generic GroupDefinitionType Source # 
Hashable GroupDefinitionType Source # 
ToJSON GroupDefinitionType Source # 
FromJSON GroupDefinitionType Source # 
NFData GroupDefinitionType Source # 

Methods

rnf :: GroupDefinitionType -> () #

ToHeader GroupDefinitionType Source # 
ToQuery GroupDefinitionType Source # 
ToByteString GroupDefinitionType Source # 
FromText GroupDefinitionType Source # 
ToText GroupDefinitionType Source # 
type Rep GroupDefinitionType Source # 
type Rep GroupDefinitionType = D1 * (MetaData "GroupDefinitionType" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) ((:+:) * (C1 * (MetaCons "Dimension" PrefixI False) (U1 *)) (C1 * (MetaCons "Tag" PrefixI False) (U1 *)))

LookbackPeriodInDays

data LookbackPeriodInDays Source #

Instances

Bounded LookbackPeriodInDays Source # 
Enum LookbackPeriodInDays Source # 
Eq LookbackPeriodInDays Source # 
Data LookbackPeriodInDays Source # 

Methods

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

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

toConstr :: LookbackPeriodInDays -> Constr #

dataTypeOf :: LookbackPeriodInDays -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord LookbackPeriodInDays Source # 
Read LookbackPeriodInDays Source # 
Show LookbackPeriodInDays Source # 
Generic LookbackPeriodInDays Source # 
Hashable LookbackPeriodInDays Source # 
ToJSON LookbackPeriodInDays Source # 
FromJSON LookbackPeriodInDays Source # 
NFData LookbackPeriodInDays Source # 

Methods

rnf :: LookbackPeriodInDays -> () #

ToHeader LookbackPeriodInDays Source # 
ToQuery LookbackPeriodInDays Source # 
ToByteString LookbackPeriodInDays Source # 
FromText LookbackPeriodInDays Source # 
ToText LookbackPeriodInDays Source # 
type Rep LookbackPeriodInDays Source # 
type Rep LookbackPeriodInDays = D1 * (MetaData "LookbackPeriodInDays" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) ((:+:) * (C1 * (MetaCons "SevenDays" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "SixtyDays" PrefixI False) (U1 *)) (C1 * (MetaCons "ThirtyDays" PrefixI False) (U1 *))))

OfferingClass

data OfferingClass Source #

Constructors

Convertible 
Standard 

Instances

Bounded OfferingClass Source # 
Enum OfferingClass Source # 
Eq OfferingClass Source # 
Data OfferingClass Source # 

Methods

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

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

toConstr :: OfferingClass -> Constr #

dataTypeOf :: OfferingClass -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OfferingClass Source # 
Read OfferingClass Source # 
Show OfferingClass Source # 
Generic OfferingClass Source # 

Associated Types

type Rep OfferingClass :: * -> * #

Hashable OfferingClass Source # 
ToJSON OfferingClass Source # 
FromJSON OfferingClass Source # 
NFData OfferingClass Source # 

Methods

rnf :: OfferingClass -> () #

ToHeader OfferingClass Source # 
ToQuery OfferingClass Source # 
ToByteString OfferingClass Source # 
FromText OfferingClass Source # 
ToText OfferingClass Source # 

Methods

toText :: OfferingClass -> Text #

type Rep OfferingClass Source # 
type Rep OfferingClass = D1 * (MetaData "OfferingClass" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) ((:+:) * (C1 * (MetaCons "Convertible" PrefixI False) (U1 *)) (C1 * (MetaCons "Standard" PrefixI False) (U1 *)))

PaymentOption

data PaymentOption Source #

Instances

Bounded PaymentOption Source # 
Enum PaymentOption Source # 
Eq PaymentOption Source # 
Data PaymentOption Source # 

Methods

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

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

toConstr :: PaymentOption -> Constr #

dataTypeOf :: PaymentOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PaymentOption Source # 
Read PaymentOption Source # 
Show PaymentOption Source # 
Generic PaymentOption Source # 

Associated Types

type Rep PaymentOption :: * -> * #

Hashable PaymentOption Source # 
ToJSON PaymentOption Source # 
FromJSON PaymentOption Source # 
NFData PaymentOption Source # 

Methods

rnf :: PaymentOption -> () #

ToHeader PaymentOption Source # 
ToQuery PaymentOption Source # 
ToByteString PaymentOption Source # 
FromText PaymentOption Source # 
ToText PaymentOption Source # 

Methods

toText :: PaymentOption -> Text #

type Rep PaymentOption Source # 
type Rep PaymentOption = D1 * (MetaData "PaymentOption" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) ((:+:) * (C1 * (MetaCons "AllUpfront" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "NoUpfront" PrefixI False) (U1 *)) (C1 * (MetaCons "PartialUpfront" PrefixI False) (U1 *))))

TermInYears

data TermInYears Source #

Constructors

OneYear 
ThreeYears 

Instances

Bounded TermInYears Source # 
Enum TermInYears Source # 
Eq TermInYears Source # 
Data TermInYears Source # 

Methods

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

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

toConstr :: TermInYears -> Constr #

dataTypeOf :: TermInYears -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TermInYears Source # 
Read TermInYears Source # 
Show TermInYears Source # 
Generic TermInYears Source # 

Associated Types

type Rep TermInYears :: * -> * #

Hashable TermInYears Source # 
ToJSON TermInYears Source # 
FromJSON TermInYears Source # 
NFData TermInYears Source # 

Methods

rnf :: TermInYears -> () #

ToHeader TermInYears Source # 
ToQuery TermInYears Source # 
ToByteString TermInYears Source # 
FromText TermInYears Source # 
ToText TermInYears Source # 

Methods

toText :: TermInYears -> Text #

type Rep TermInYears Source # 
type Rep TermInYears = D1 * (MetaData "TermInYears" "Network.AWS.CostExplorer.Types.Sum" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) ((:+:) * (C1 * (MetaCons "OneYear" PrefixI False) (U1 *)) (C1 * (MetaCons "ThreeYears" PrefixI False) (U1 *)))

Coverage

data Coverage Source #

The amount of instance usage that a reservation covered.

See: coverage smart constructor.

Instances

Eq Coverage Source # 
Data Coverage Source # 

Methods

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

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

toConstr :: Coverage -> Constr #

dataTypeOf :: Coverage -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Coverage Source # 
Show Coverage Source # 
Generic Coverage Source # 

Associated Types

type Rep Coverage :: * -> * #

Methods

from :: Coverage -> Rep Coverage x #

to :: Rep Coverage x -> Coverage #

Hashable Coverage Source # 

Methods

hashWithSalt :: Int -> Coverage -> Int #

hash :: Coverage -> Int #

FromJSON Coverage Source # 
NFData Coverage Source # 

Methods

rnf :: Coverage -> () #

type Rep Coverage Source # 
type Rep Coverage = D1 * (MetaData "Coverage" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" True) (C1 * (MetaCons "Coverage'" PrefixI True) (S1 * (MetaSel (Just Symbol "_cCoverageHours") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe CoverageHours))))

coverage :: Coverage Source #

Creates a value of Coverage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • cCoverageHours - The amount of instance usage that a reservation covered, in hours.

cCoverageHours :: Lens' Coverage (Maybe CoverageHours) Source #

The amount of instance usage that a reservation covered, in hours.

CoverageByTime

data CoverageByTime Source #

Reservation coverage for a specified period, in hours.

See: coverageByTime smart constructor.

Instances

Eq CoverageByTime Source # 
Data CoverageByTime Source # 

Methods

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

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

toConstr :: CoverageByTime -> Constr #

dataTypeOf :: CoverageByTime -> DataType #

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

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

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

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

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

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

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

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

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

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

Read CoverageByTime Source # 
Show CoverageByTime Source # 
Generic CoverageByTime Source # 

Associated Types

type Rep CoverageByTime :: * -> * #

Hashable CoverageByTime Source # 
FromJSON CoverageByTime Source # 
NFData CoverageByTime Source # 

Methods

rnf :: CoverageByTime -> () #

type Rep CoverageByTime Source # 
type Rep CoverageByTime = D1 * (MetaData "CoverageByTime" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "CoverageByTime'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_cbtGroups") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe [ReservationCoverageGroup]))) ((:*:) * (S1 * (MetaSel (Just Symbol "_cbtTimePeriod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe DateInterval))) (S1 * (MetaSel (Just Symbol "_cbtTotal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Coverage))))))

coverageByTime :: CoverageByTime Source #

Creates a value of CoverageByTime with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • cbtGroups - The groups of instances that are covered by a reservation.
  • cbtTimePeriod - The period over which this coverage was used.
  • cbtTotal - The total reservation coverage, in hours.

cbtGroups :: Lens' CoverageByTime [ReservationCoverageGroup] Source #

The groups of instances that are covered by a reservation.

cbtTimePeriod :: Lens' CoverageByTime (Maybe DateInterval) Source #

The period over which this coverage was used.

cbtTotal :: Lens' CoverageByTime (Maybe Coverage) Source #

The total reservation coverage, in hours.

CoverageHours

data CoverageHours Source #

How long a running instance either used a reservation or was On-Demand.

See: coverageHours smart constructor.

Instances

Eq CoverageHours Source # 
Data CoverageHours Source # 

Methods

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

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

toConstr :: CoverageHours -> Constr #

dataTypeOf :: CoverageHours -> DataType #

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

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

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

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

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

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

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

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

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

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

Read CoverageHours Source # 
Show CoverageHours Source # 
Generic CoverageHours Source # 

Associated Types

type Rep CoverageHours :: * -> * #

Hashable CoverageHours Source # 
FromJSON CoverageHours Source # 
NFData CoverageHours Source # 

Methods

rnf :: CoverageHours -> () #

type Rep CoverageHours Source # 
type Rep CoverageHours = D1 * (MetaData "CoverageHours" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "CoverageHours'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_chCoverageHoursPercentage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_chOnDemandHours") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_chTotalRunningHours") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_chReservedHours") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))))))

coverageHours :: CoverageHours Source #

Creates a value of CoverageHours with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

chCoverageHoursPercentage :: Lens' CoverageHours (Maybe Text) Source #

The percentage of instance hours that are covered by a reservation.

chOnDemandHours :: Lens' CoverageHours (Maybe Text) Source #

The number of instance running hours that are covered by On-Demand Instances.

chTotalRunningHours :: Lens' CoverageHours (Maybe Text) Source #

The total instance usage, in hours.

chReservedHours :: Lens' CoverageHours (Maybe Text) Source #

The number of instance running hours that are covered by reservations.

DateInterval

data DateInterval Source #

The time period that you want the usage and costs for.

See: dateInterval smart constructor.

Instances

Eq DateInterval Source # 
Data DateInterval Source # 

Methods

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

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

toConstr :: DateInterval -> Constr #

dataTypeOf :: DateInterval -> DataType #

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

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

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

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

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

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

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

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

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

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

Read DateInterval Source # 
Show DateInterval Source # 
Generic DateInterval Source # 

Associated Types

type Rep DateInterval :: * -> * #

Hashable DateInterval Source # 
ToJSON DateInterval Source # 
FromJSON DateInterval Source # 
NFData DateInterval Source # 

Methods

rnf :: DateInterval -> () #

type Rep DateInterval Source # 
type Rep DateInterval = D1 * (MetaData "DateInterval" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "DateInterval'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_diStart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_diEnd") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text))))

dateInterval Source #

Creates a value of DateInterval with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • diStart - The beginning of the time period that you want the usage and costs for. The start date is inclusive. For example, if start is 2017-01-01 , AWS retrieves cost and usage data starting at 2017-01-01 up to the end date.
  • diEnd - The end of the time period that you want the usage and costs for. The end date is exclusive. For example, if end is 2017-05-01 , AWS retrieves cost and usage data from the start date up to, but not including, 2017-05-01 .

diStart :: Lens' DateInterval Text Source #

The beginning of the time period that you want the usage and costs for. The start date is inclusive. For example, if start is 2017-01-01 , AWS retrieves cost and usage data starting at 2017-01-01 up to the end date.

diEnd :: Lens' DateInterval Text Source #

The end of the time period that you want the usage and costs for. The end date is exclusive. For example, if end is 2017-05-01 , AWS retrieves cost and usage data from the start date up to, but not including, 2017-05-01 .

DimensionValues

data DimensionValues Source #

The metadata that you can use to filter and group your results. You can use GetDimensionValues to find specific values.

See: dimensionValues smart constructor.

Instances

Eq DimensionValues Source # 
Data DimensionValues Source # 

Methods

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

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

toConstr :: DimensionValues -> Constr #

dataTypeOf :: DimensionValues -> DataType #

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

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

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

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

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

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

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

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

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

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

Read DimensionValues Source # 
Show DimensionValues Source # 
Generic DimensionValues Source # 
Hashable DimensionValues Source # 
ToJSON DimensionValues Source # 
NFData DimensionValues Source # 

Methods

rnf :: DimensionValues -> () #

type Rep DimensionValues Source # 
type Rep DimensionValues = D1 * (MetaData "DimensionValues" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "DimensionValues'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_dvValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe [Text]))) (S1 * (MetaSel (Just Symbol "_dvKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Dimension)))))

dimensionValues :: DimensionValues Source #

Creates a value of DimensionValues with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • dvValues - The metadata values that you can use to filter and group your results. You can use GetDimensionValues to find specific values.
  • dvKey - The names of the metadata types that you can use to filter and group your results. For example, AZ returns a list of Availability Zones.

dvValues :: Lens' DimensionValues [Text] Source #

The metadata values that you can use to filter and group your results. You can use GetDimensionValues to find specific values.

dvKey :: Lens' DimensionValues (Maybe Dimension) Source #

The names of the metadata types that you can use to filter and group your results. For example, AZ returns a list of Availability Zones.

DimensionValuesWithAttributes

data DimensionValuesWithAttributes Source #

The metadata of a specific type that you can use to filter and group your results. You can use GetDimensionValues to find specific values.

See: dimensionValuesWithAttributes smart constructor.

Instances

Eq DimensionValuesWithAttributes Source # 
Data DimensionValuesWithAttributes Source # 

Methods

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

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

toConstr :: DimensionValuesWithAttributes -> Constr #

dataTypeOf :: DimensionValuesWithAttributes -> DataType #

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

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

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

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

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

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

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

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

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

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

Read DimensionValuesWithAttributes Source # 
Show DimensionValuesWithAttributes Source # 
Generic DimensionValuesWithAttributes Source # 
Hashable DimensionValuesWithAttributes Source # 
FromJSON DimensionValuesWithAttributes Source # 
NFData DimensionValuesWithAttributes Source # 
type Rep DimensionValuesWithAttributes Source # 
type Rep DimensionValuesWithAttributes = D1 * (MetaData "DimensionValuesWithAttributes" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "DimensionValuesWithAttributes'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_dvwaValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_dvwaAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe (Map Text Text))))))

dimensionValuesWithAttributes :: DimensionValuesWithAttributes Source #

Creates a value of DimensionValuesWithAttributes with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • dvwaValue - The value of a dimension with a specific attribute.
  • dvwaAttributes - The attribute that applies to a specific Dimension .

dvwaValue :: Lens' DimensionValuesWithAttributes (Maybe Text) Source #

The value of a dimension with a specific attribute.

dvwaAttributes :: Lens' DimensionValuesWithAttributes (HashMap Text Text) Source #

The attribute that applies to a specific Dimension .

EC2InstanceDetails

data EC2InstanceDetails Source #

Details about the EC2 instances that AWS recommends that you purchase.

See: ec2InstanceDetails smart constructor.

Instances

Eq EC2InstanceDetails Source # 
Data EC2InstanceDetails Source # 

Methods

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

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

toConstr :: EC2InstanceDetails -> Constr #

dataTypeOf :: EC2InstanceDetails -> DataType #

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

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

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

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

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

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

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

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

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

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

Read EC2InstanceDetails Source # 
Show EC2InstanceDetails Source # 
Generic EC2InstanceDetails Source # 
Hashable EC2InstanceDetails Source # 
FromJSON EC2InstanceDetails Source # 
NFData EC2InstanceDetails Source # 

Methods

rnf :: EC2InstanceDetails -> () #

type Rep EC2InstanceDetails Source # 
type Rep EC2InstanceDetails = D1 * (MetaData "EC2InstanceDetails" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "EC2InstanceDetails'" PrefixI True) ((:*:) * ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_eidCurrentGeneration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Bool))) (S1 * (MetaSel (Just Symbol "_eidPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_eidFamily") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_eidInstanceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))))) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_eidAvailabilityZone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_eidSizeFlexEligible") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Bool)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_eidTenancy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_eidRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))))))

ec2InstanceDetails :: EC2InstanceDetails Source #

Creates a value of EC2InstanceDetails with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • eidCurrentGeneration - Whether the recommendation is for a current generation instance.
  • eidPlatform - The platform of the recommended reservation. The platform is the specific combination of operating system, license model, and software on an instance.
  • eidFamily - The instance family of the recommended reservation.
  • eidInstanceType - The type of instance that AWS recommends.
  • eidAvailabilityZone - The Availability Zone of the recommended reservation.
  • eidSizeFlexEligible - Whether the recommended reservation is size flexible.
  • eidTenancy - Whether the recommended reservation is dedicated or shared.
  • eidRegion - The AWS Region of the recommended reservation.

eidCurrentGeneration :: Lens' EC2InstanceDetails (Maybe Bool) Source #

Whether the recommendation is for a current generation instance.

eidPlatform :: Lens' EC2InstanceDetails (Maybe Text) Source #

The platform of the recommended reservation. The platform is the specific combination of operating system, license model, and software on an instance.

eidFamily :: Lens' EC2InstanceDetails (Maybe Text) Source #

The instance family of the recommended reservation.

eidInstanceType :: Lens' EC2InstanceDetails (Maybe Text) Source #

The type of instance that AWS recommends.

eidAvailabilityZone :: Lens' EC2InstanceDetails (Maybe Text) Source #

The Availability Zone of the recommended reservation.

eidSizeFlexEligible :: Lens' EC2InstanceDetails (Maybe Bool) Source #

Whether the recommended reservation is size flexible.

eidTenancy :: Lens' EC2InstanceDetails (Maybe Text) Source #

Whether the recommended reservation is dedicated or shared.

eidRegion :: Lens' EC2InstanceDetails (Maybe Text) Source #

The AWS Region of the recommended reservation.

EC2Specification

data EC2Specification Source #

The EC2 hardware specifications that you want AWS to provide recommendations for.

See: ec2Specification smart constructor.

Instances

Eq EC2Specification Source # 
Data EC2Specification Source # 

Methods

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

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

toConstr :: EC2Specification -> Constr #

dataTypeOf :: EC2Specification -> DataType #

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

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

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

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

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

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

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

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

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

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

Read EC2Specification Source # 
Show EC2Specification Source # 
Generic EC2Specification Source # 
Hashable EC2Specification Source # 
ToJSON EC2Specification Source # 
FromJSON EC2Specification Source # 
NFData EC2Specification Source # 

Methods

rnf :: EC2Specification -> () #

type Rep EC2Specification Source # 
type Rep EC2Specification = D1 * (MetaData "EC2Specification" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" True) (C1 * (MetaCons "EC2Specification'" PrefixI True) (S1 * (MetaSel (Just Symbol "_esOfferingClass") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe OfferingClass))))

ec2Specification :: EC2Specification Source #

Creates a value of EC2Specification with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • esOfferingClass - Whether you want a recommendation for standard or convertible reservations.

esOfferingClass :: Lens' EC2Specification (Maybe OfferingClass) Source #

Whether you want a recommendation for standard or convertible reservations.

Expression

data Expression Source #

Use Expression to filter by cost or by usage. There are two patterns:

  • Simple dimension values - You can set the dimension name and values for the filters that you plan to use. For example, you can filter for INSTANCE_TYPE==m4.xlarge OR INSTANCE_TYPE==c4.large . The Expression for that looks like this:
{ Dimensions: { Key: INSTANCE_TYPE, Values: [ "m4.xlarge", “c4.large” ] } }

The list of dimension values are OR'd together to retrieve cost or usage data. You can create Expression and DimensionValues objects using either with* methods or set* methods in multiple lines.

  • Compound dimension values with logical operations - You can use multiple Expression types and the logical operators ANDORNOT to create a list of one or more Expression objects. This allows you to filter on more advanced options. For example, you can filter on ((INSTANCE_TYPE == m4.large OR INSTANCE_TYPE == m3.large) OR (TAG.Type == Type1)) AND (USAGE_TYPE != DataTransfer) . The Expression for that looks like this:
{ And: [ {Or: [ {Dimensions: { Key: INSTANCE_TYPE, Values: [ "m4.x.large", "c4.large" ] }}, {Tag: { Key: TagName, Values: [Value1] } } ]}, {Not: {"dimensions": { Key: USAGE_TYPE, Values: [DataTransfer] }}} ] }
{ And: [ ... ], DimensionValues: { Dimension: USAGE_TYPE, Values: [ DataTransfer ] } }

See: expression smart constructor.

Instances

Eq Expression Source # 
Data Expression Source # 

Methods

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

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

toConstr :: Expression -> Constr #

dataTypeOf :: Expression -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Expression Source # 
Show Expression Source # 
Generic Expression Source # 

Associated Types

type Rep Expression :: * -> * #

Hashable Expression Source # 
ToJSON Expression Source # 
NFData Expression Source # 

Methods

rnf :: Expression -> () #

type Rep Expression Source # 

expression :: Expression Source #

Creates a value of Expression with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • eNot - Return results that don't match a Dimension object.
  • eAnd - Return results that match both Dimension objects.
  • eOr - Return results that match either Dimension object.
  • eDimensions - The specific Dimension to use for Expression .
  • eTags - The specific Tag to use for Expression .

eNot :: Lens' Expression (Maybe Expression) Source #

Return results that don't match a Dimension object.

eAnd :: Lens' Expression [Expression] Source #

Return results that match both Dimension objects.

eOr :: Lens' Expression [Expression] Source #

Return results that match either Dimension object.

eDimensions :: Lens' Expression (Maybe DimensionValues) Source #

The specific Dimension to use for Expression .

eTags :: Lens' Expression (Maybe TagValues) Source #

The specific Tag to use for Expression .

Group

data Group Source #

One level of grouped data within the results.

See: group' smart constructor.

Instances

Eq Group Source # 

Methods

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

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

Data Group Source # 

Methods

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

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

toConstr :: Group -> Constr #

dataTypeOf :: Group -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Group Source # 
Show Group Source # 

Methods

showsPrec :: Int -> Group -> ShowS #

show :: Group -> String #

showList :: [Group] -> ShowS #

Generic Group Source # 

Associated Types

type Rep Group :: * -> * #

Methods

from :: Group -> Rep Group x #

to :: Rep Group x -> Group #

Hashable Group Source # 

Methods

hashWithSalt :: Int -> Group -> Int #

hash :: Group -> Int #

FromJSON Group Source # 
NFData Group Source # 

Methods

rnf :: Group -> () #

type Rep Group Source # 
type Rep Group = D1 * (MetaData "Group" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "Group'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_gMetrics") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe (Map Text MetricValue)))) (S1 * (MetaSel (Just Symbol "_gKeys") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe [Text])))))

group' :: Group Source #

Creates a value of Group with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • gMetrics - The metrics that are included in this group.
  • gKeys - The keys that are included in this group.

gMetrics :: Lens' Group (HashMap Text MetricValue) Source #

The metrics that are included in this group.

gKeys :: Lens' Group [Text] Source #

The keys that are included in this group.

GroupDefinition

data GroupDefinition Source #

Represents a group when you specify a group by criteria, or in the response to a query with a specific grouping.

See: groupDefinition smart constructor.

Instances

Eq GroupDefinition Source # 
Data GroupDefinition Source # 

Methods

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

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

toConstr :: GroupDefinition -> Constr #

dataTypeOf :: GroupDefinition -> DataType #

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

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

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

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

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

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

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

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

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

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

Read GroupDefinition Source # 
Show GroupDefinition Source # 
Generic GroupDefinition Source # 
Hashable GroupDefinition Source # 
ToJSON GroupDefinition Source # 
FromJSON GroupDefinition Source # 
NFData GroupDefinition Source # 

Methods

rnf :: GroupDefinition -> () #

type Rep GroupDefinition Source # 
type Rep GroupDefinition = D1 * (MetaData "GroupDefinition" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "GroupDefinition'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_gdKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_gdType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe GroupDefinitionType)))))

groupDefinition :: GroupDefinition Source #

Creates a value of GroupDefinition with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • gdKey - The string that represents a key for a specified group.
  • gdType - The string that represents the type of group.

gdKey :: Lens' GroupDefinition (Maybe Text) Source #

The string that represents a key for a specified group.

gdType :: Lens' GroupDefinition (Maybe GroupDefinitionType) Source #

The string that represents the type of group.

InstanceDetails

data InstanceDetails Source #

Details about the instances that AWS recommends that you purchase.

See: instanceDetails smart constructor.

Instances

Eq InstanceDetails Source # 
Data InstanceDetails Source # 

Methods

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

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

toConstr :: InstanceDetails -> Constr #

dataTypeOf :: InstanceDetails -> DataType #

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

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

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

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

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

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

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

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

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

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

Read InstanceDetails Source # 
Show InstanceDetails Source # 
Generic InstanceDetails Source # 
Hashable InstanceDetails Source # 
FromJSON InstanceDetails Source # 
NFData InstanceDetails Source # 

Methods

rnf :: InstanceDetails -> () #

type Rep InstanceDetails Source # 
type Rep InstanceDetails = D1 * (MetaData "InstanceDetails" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "InstanceDetails'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_idRDSInstanceDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe RDSInstanceDetails))) (S1 * (MetaSel (Just Symbol "_idEC2InstanceDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe EC2InstanceDetails)))))

instanceDetails :: InstanceDetails Source #

Creates a value of InstanceDetails with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

idRDSInstanceDetails :: Lens' InstanceDetails (Maybe RDSInstanceDetails) Source #

The RDS instances that AWS recommends that you purchase.

idEC2InstanceDetails :: Lens' InstanceDetails (Maybe EC2InstanceDetails) Source #

The EC2 instances that AWS recommends that you purchase.

MetricValue

data MetricValue Source #

The aggregated value for a metric.

See: metricValue smart constructor.

Instances

Eq MetricValue Source # 
Data MetricValue Source # 

Methods

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

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

toConstr :: MetricValue -> Constr #

dataTypeOf :: MetricValue -> DataType #

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

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

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

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

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

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

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

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

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

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

Read MetricValue Source # 
Show MetricValue Source # 
Generic MetricValue Source # 

Associated Types

type Rep MetricValue :: * -> * #

Hashable MetricValue Source # 
FromJSON MetricValue Source # 
NFData MetricValue Source # 

Methods

rnf :: MetricValue -> () #

type Rep MetricValue Source # 
type Rep MetricValue = D1 * (MetaData "MetricValue" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "MetricValue'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_mvAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_mvUnit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))))

metricValue :: MetricValue Source #

Creates a value of MetricValue with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • mvAmount - The actual number that represents the metric.
  • mvUnit - The unit that the metric is given in.

mvAmount :: Lens' MetricValue (Maybe Text) Source #

The actual number that represents the metric.

mvUnit :: Lens' MetricValue (Maybe Text) Source #

The unit that the metric is given in.

RDSInstanceDetails

data RDSInstanceDetails Source #

Details about the RDS instances that AWS recommends that you purchase.

See: rdsInstanceDetails smart constructor.

Instances

Eq RDSInstanceDetails Source # 
Data RDSInstanceDetails Source # 

Methods

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

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

toConstr :: RDSInstanceDetails -> Constr #

dataTypeOf :: RDSInstanceDetails -> DataType #

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

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

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

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

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

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

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

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

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

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

Read RDSInstanceDetails Source # 
Show RDSInstanceDetails Source # 
Generic RDSInstanceDetails Source # 
Hashable RDSInstanceDetails Source # 
FromJSON RDSInstanceDetails Source # 
NFData RDSInstanceDetails Source # 

Methods

rnf :: RDSInstanceDetails -> () #

type Rep RDSInstanceDetails Source # 
type Rep RDSInstanceDetails = D1 * (MetaData "RDSInstanceDetails" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "RDSInstanceDetails'" PrefixI True) ((:*:) * ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_ridCurrentGeneration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Bool))) (S1 * (MetaSel (Just Symbol "_ridDeploymentOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_ridFamily") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_ridInstanceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))))) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_ridLicenseModel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_ridSizeFlexEligible") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Bool)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_ridRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_ridDatabaseEngine") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))))))

rdsInstanceDetails :: RDSInstanceDetails Source #

Creates a value of RDSInstanceDetails with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ridCurrentGeneration - Whether the recommendation is for a current generation instance.
  • ridDeploymentOption - Whether the recommendation is for a reservation in a single availability zone or a reservation with a backup in a second availability zone.
  • ridFamily - The instance family of the recommended reservation.
  • ridInstanceType - The type of instance that AWS recommends.
  • ridLicenseModel - The license model that the recommended reservation supports.
  • ridSizeFlexEligible - Whether the recommended reservation is size flexible.
  • ridRegion - The AWS Region of the recommended reservation.
  • ridDatabaseEngine - The database engine that the recommended reservation supports.

ridCurrentGeneration :: Lens' RDSInstanceDetails (Maybe Bool) Source #

Whether the recommendation is for a current generation instance.

ridDeploymentOption :: Lens' RDSInstanceDetails (Maybe Text) Source #

Whether the recommendation is for a reservation in a single availability zone or a reservation with a backup in a second availability zone.

ridFamily :: Lens' RDSInstanceDetails (Maybe Text) Source #

The instance family of the recommended reservation.

ridInstanceType :: Lens' RDSInstanceDetails (Maybe Text) Source #

The type of instance that AWS recommends.

ridLicenseModel :: Lens' RDSInstanceDetails (Maybe Text) Source #

The license model that the recommended reservation supports.

ridSizeFlexEligible :: Lens' RDSInstanceDetails (Maybe Bool) Source #

Whether the recommended reservation is size flexible.

ridRegion :: Lens' RDSInstanceDetails (Maybe Text) Source #

The AWS Region of the recommended reservation.

ridDatabaseEngine :: Lens' RDSInstanceDetails (Maybe Text) Source #

The database engine that the recommended reservation supports.

ReservationAggregates

data ReservationAggregates Source #

The aggregated numbers for your RI usage.

See: reservationAggregates smart constructor.

Instances

Eq ReservationAggregates Source # 
Data ReservationAggregates Source # 

Methods

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

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

toConstr :: ReservationAggregates -> Constr #

dataTypeOf :: ReservationAggregates -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ReservationAggregates Source # 
Show ReservationAggregates Source # 
Generic ReservationAggregates Source # 
Hashable ReservationAggregates Source # 
FromJSON ReservationAggregates Source # 
NFData ReservationAggregates Source # 

Methods

rnf :: ReservationAggregates -> () #

type Rep ReservationAggregates Source # 
type Rep ReservationAggregates = D1 * (MetaData "ReservationAggregates" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "ReservationAggregates'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_raPurchasedHours") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_raTotalActualHours") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_raUtilizationPercentage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_raUnusedHours") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))))))

reservationAggregates :: ReservationAggregates Source #

Creates a value of ReservationAggregates with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

raPurchasedHours :: Lens' ReservationAggregates (Maybe Text) Source #

How many RI hours that you purchased.

raTotalActualHours :: Lens' ReservationAggregates (Maybe Text) Source #

The total number of RI hours that you used.

raUtilizationPercentage :: Lens' ReservationAggregates (Maybe Text) Source #

The percentage of RI time that you used.

raUnusedHours :: Lens' ReservationAggregates (Maybe Text) Source #

The number of RI hours that you didn't use.

ReservationCoverageGroup

data ReservationCoverageGroup Source #

A group of reservations that share a set of attributes.

See: reservationCoverageGroup smart constructor.

Instances

Eq ReservationCoverageGroup Source # 
Data ReservationCoverageGroup Source # 

Methods

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

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

toConstr :: ReservationCoverageGroup -> Constr #

dataTypeOf :: ReservationCoverageGroup -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ReservationCoverageGroup Source # 
Show ReservationCoverageGroup Source # 
Generic ReservationCoverageGroup Source # 
Hashable ReservationCoverageGroup Source # 
FromJSON ReservationCoverageGroup Source # 
NFData ReservationCoverageGroup Source # 
type Rep ReservationCoverageGroup Source # 
type Rep ReservationCoverageGroup = D1 * (MetaData "ReservationCoverageGroup" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "ReservationCoverageGroup'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_rcgCoverage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Coverage))) (S1 * (MetaSel (Just Symbol "_rcgAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe (Map Text Text))))))

reservationCoverageGroup :: ReservationCoverageGroup Source #

Creates a value of ReservationCoverageGroup with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • rcgCoverage - How much instance usage this group of reservations covered.
  • rcgAttributes - The attributes for this group of reservations.

rcgCoverage :: Lens' ReservationCoverageGroup (Maybe Coverage) Source #

How much instance usage this group of reservations covered.

rcgAttributes :: Lens' ReservationCoverageGroup (HashMap Text Text) Source #

The attributes for this group of reservations.

ReservationPurchaseRecommendation

data ReservationPurchaseRecommendation Source #

A specific reservation that AWS recommends for purchase.

See: reservationPurchaseRecommendation smart constructor.

Instances

Eq ReservationPurchaseRecommendation Source # 
Data ReservationPurchaseRecommendation Source # 

Methods

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

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

toConstr :: ReservationPurchaseRecommendation -> Constr #

dataTypeOf :: ReservationPurchaseRecommendation -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ReservationPurchaseRecommendation Source # 
Show ReservationPurchaseRecommendation Source # 
Generic ReservationPurchaseRecommendation Source # 
Hashable ReservationPurchaseRecommendation Source # 
FromJSON ReservationPurchaseRecommendation Source # 
NFData ReservationPurchaseRecommendation Source # 
type Rep ReservationPurchaseRecommendation Source # 
type Rep ReservationPurchaseRecommendation = D1 * (MetaData "ReservationPurchaseRecommendation" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "ReservationPurchaseRecommendation'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rprTermInYears") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe TermInYears))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprRecommendationSummary") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe ReservationPurchaseRecommendationSummary))) (S1 * (MetaSel (Just Symbol "_rprServiceSpecification") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe ServiceSpecification))))) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rprAccountScope") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe AccountScope))) (S1 * (MetaSel (Just Symbol "_rprRecommendationDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe [ReservationPurchaseRecommendationDetail])))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprLookbackPeriodInDays") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe LookbackPeriodInDays))) (S1 * (MetaSel (Just Symbol "_rprPaymentOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe PaymentOption)))))))

reservationPurchaseRecommendation :: ReservationPurchaseRecommendation Source #

Creates a value of ReservationPurchaseRecommendation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • rprTermInYears - The term of the reservation that you want recommendations for, in years.
  • rprRecommendationSummary - A summary about the recommended purchase.
  • rprServiceSpecification - Hardware specifications for the service that you want recommendations for.
  • rprAccountScope - The account scope that AWS recommends that you purchase this instance for. For example, you can purchase this reservation for an entire organization in AWS Organizations.
  • rprRecommendationDetails - Details about the recommended purchases.
  • rprLookbackPeriodInDays - How many days of previous usage that AWS takes into consideration when making this recommendation.
  • rprPaymentOption - The payment option for the reservation. For example, AllUpfront or NoUpfront .

rprTermInYears :: Lens' ReservationPurchaseRecommendation (Maybe TermInYears) Source #

The term of the reservation that you want recommendations for, in years.

rprServiceSpecification :: Lens' ReservationPurchaseRecommendation (Maybe ServiceSpecification) Source #

Hardware specifications for the service that you want recommendations for.

rprAccountScope :: Lens' ReservationPurchaseRecommendation (Maybe AccountScope) Source #

The account scope that AWS recommends that you purchase this instance for. For example, you can purchase this reservation for an entire organization in AWS Organizations.

rprLookbackPeriodInDays :: Lens' ReservationPurchaseRecommendation (Maybe LookbackPeriodInDays) Source #

How many days of previous usage that AWS takes into consideration when making this recommendation.

rprPaymentOption :: Lens' ReservationPurchaseRecommendation (Maybe PaymentOption) Source #

The payment option for the reservation. For example, AllUpfront or NoUpfront .

ReservationPurchaseRecommendationDetail

data ReservationPurchaseRecommendationDetail Source #

Details about your recommended reservation purchase.

See: reservationPurchaseRecommendationDetail smart constructor.

Instances

Eq ReservationPurchaseRecommendationDetail Source # 
Data ReservationPurchaseRecommendationDetail Source # 

Methods

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

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

toConstr :: ReservationPurchaseRecommendationDetail -> Constr #

dataTypeOf :: ReservationPurchaseRecommendationDetail -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ReservationPurchaseRecommendationDetail Source # 
Show ReservationPurchaseRecommendationDetail Source # 
Generic ReservationPurchaseRecommendationDetail Source # 
Hashable ReservationPurchaseRecommendationDetail Source # 
FromJSON ReservationPurchaseRecommendationDetail Source # 
NFData ReservationPurchaseRecommendationDetail Source # 
type Rep ReservationPurchaseRecommendationDetail Source # 
type Rep ReservationPurchaseRecommendationDetail = D1 * (MetaData "ReservationPurchaseRecommendationDetail" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "ReservationPurchaseRecommendationDetail'" PrefixI True) ((:*:) * ((:*:) * ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdMaximumNormalizedUnitsUsedPerHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprdRecurringStandardMonthlyCost") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdAverageNormalizedUnitsUsedPerHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprdCurrencyCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))))) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdEstimatedMonthlySavingsPercentage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprdRecommendedNormalizedUnitsToPurchase") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdAverageUtilization") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdEstimatedMonthlySavingsAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprdUpfrontCost") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))))))) ((:*:) * ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdMinimumNormalizedUnitsUsedPerHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprdEstimatedMonthlyOnDemandCost") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdRecommendedNumberOfInstancesToPurchase") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprdMaximumNumberOfInstancesUsedPerHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))))) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdEstimatedReservationCostForLookbackPeriod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprdInstanceDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe InstanceDetails)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdAverageNumberOfInstancesUsedPerHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprdMinimumNumberOfInstancesUsedPerHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprdEstimatedBreakEvenInMonths") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))))))))

reservationPurchaseRecommendationDetail :: ReservationPurchaseRecommendationDetail Source #

Creates a value of ReservationPurchaseRecommendationDetail with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rprdMaximumNormalizedUnitsUsedPerHour :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The maximum number of normalized units that you used in an hour during the historical period. AWS uses this to calculate your recommended reservation purchases.

rprdRecurringStandardMonthlyCost :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

How much purchasing this instance costs you on a monthly basis.

rprdAverageNormalizedUnitsUsedPerHour :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The average number of normalized units that you used in an hour during the historical period. AWS uses this to calculate your recommended reservation purchases.

rprdCurrencyCode :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The currency code that AWS used to calculate the costs for this instance.

rprdEstimatedMonthlySavingsPercentage :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

How much AWS estimates that this specific recommendation could save you in a month, as a percentage of your overall costs.

rprdRecommendedNormalizedUnitsToPurchase :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The number of normalized units that AWS recommends that you purchase.

rprdAverageUtilization :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The average utilization of your instances. AWS uses this to calculate your recommended reservation purchases.

rprdEstimatedMonthlySavingsAmount :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

How much AWS estimates that this specific recommendation could save you in a month.

rprdUpfrontCost :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

How much purchasing this instance costs you upfront.

rprdMinimumNormalizedUnitsUsedPerHour :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The minimum number of hours that you used in an hour during the historical period. AWS uses this to calculate your recommended reservation purchases.

rprdEstimatedMonthlyOnDemandCost :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

How much AWS estimates that you spend on On-Demand Instances in a month.

rprdRecommendedNumberOfInstancesToPurchase :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The number of instances that AWS recommends that you purchase.

rprdMaximumNumberOfInstancesUsedPerHour :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The maximum number of instances that you used in an hour during the historical period. AWS uses this to calculate your recommended reservation purchases.

rprdEstimatedReservationCostForLookbackPeriod :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

How much AWS estimates that you would have spent for all usage during the specified historical period if you had had a reservation.

rprdInstanceDetails :: Lens' ReservationPurchaseRecommendationDetail (Maybe InstanceDetails) Source #

Details about the instances that AWS recommends that you purchase.

rprdAverageNumberOfInstancesUsedPerHour :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The average number of instances that you used in an hour during the historical period. AWS uses this to calculate your recommended reservation purchases.

rprdMinimumNumberOfInstancesUsedPerHour :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

The minimum number of instances that you used in an hour during the historical period. AWS uses this to calculate your recommended reservation purchases.

rprdEstimatedBreakEvenInMonths :: Lens' ReservationPurchaseRecommendationDetail (Maybe Text) Source #

How long AWS estimates that it takes for this instance to start saving you money, in months.

ReservationPurchaseRecommendationMetadata

data ReservationPurchaseRecommendationMetadata Source #

Information about this specific recommendation, such as the time stamp for when AWS made a specific recommendation.

See: reservationPurchaseRecommendationMetadata smart constructor.

Instances

Eq ReservationPurchaseRecommendationMetadata Source # 
Data ReservationPurchaseRecommendationMetadata Source # 

Methods

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

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

toConstr :: ReservationPurchaseRecommendationMetadata -> Constr #

dataTypeOf :: ReservationPurchaseRecommendationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ReservationPurchaseRecommendationMetadata Source # 
Show ReservationPurchaseRecommendationMetadata Source # 
Generic ReservationPurchaseRecommendationMetadata Source # 
Hashable ReservationPurchaseRecommendationMetadata Source # 
FromJSON ReservationPurchaseRecommendationMetadata Source # 
NFData ReservationPurchaseRecommendationMetadata Source # 
type Rep ReservationPurchaseRecommendationMetadata Source # 
type Rep ReservationPurchaseRecommendationMetadata = D1 * (MetaData "ReservationPurchaseRecommendationMetadata" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "ReservationPurchaseRecommendationMetadata'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprmRecommendationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprmGenerationTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))))

reservationPurchaseRecommendationMetadata :: ReservationPurchaseRecommendationMetadata Source #

Creates a value of ReservationPurchaseRecommendationMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rprmGenerationTimestamp :: Lens' ReservationPurchaseRecommendationMetadata (Maybe Text) Source #

The time stamp for when AWS made this recommendation.

ReservationPurchaseRecommendationSummary

data ReservationPurchaseRecommendationSummary Source #

A summary about this recommendation, such as the currency code, the amount that AWS estimates you could save, and the total amount of reservation to purchase.

See: reservationPurchaseRecommendationSummary smart constructor.

Instances

Eq ReservationPurchaseRecommendationSummary Source # 
Data ReservationPurchaseRecommendationSummary Source # 

Methods

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

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

toConstr :: ReservationPurchaseRecommendationSummary -> Constr #

dataTypeOf :: ReservationPurchaseRecommendationSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ReservationPurchaseRecommendationSummary Source # 
Show ReservationPurchaseRecommendationSummary Source # 
Generic ReservationPurchaseRecommendationSummary Source # 
Hashable ReservationPurchaseRecommendationSummary Source # 
FromJSON ReservationPurchaseRecommendationSummary Source # 
NFData ReservationPurchaseRecommendationSummary Source # 
type Rep ReservationPurchaseRecommendationSummary Source # 
type Rep ReservationPurchaseRecommendationSummary = D1 * (MetaData "ReservationPurchaseRecommendationSummary" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "ReservationPurchaseRecommendationSummary'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprsCurrencyCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rprsTotalEstimatedMonthlySavingsPercentage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rprsTotalEstimatedMonthlySavingsAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))))))

reservationPurchaseRecommendationSummary :: ReservationPurchaseRecommendationSummary Source #

Creates a value of ReservationPurchaseRecommendationSummary with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rprsCurrencyCode :: Lens' ReservationPurchaseRecommendationSummary (Maybe Text) Source #

The currency code used for this recommendation.

rprsTotalEstimatedMonthlySavingsPercentage :: Lens' ReservationPurchaseRecommendationSummary (Maybe Text) Source #

The total amount that AWS estimates that this recommendation could save you in a month, as a percentage of your costs.

rprsTotalEstimatedMonthlySavingsAmount :: Lens' ReservationPurchaseRecommendationSummary (Maybe Text) Source #

The total amount that AWS estimates that this recommendation could save you in a month.

ReservationUtilizationGroup

data ReservationUtilizationGroup Source #

A group of RIs that share a set of attributes.

See: reservationUtilizationGroup smart constructor.

Instances

Eq ReservationUtilizationGroup Source # 
Data ReservationUtilizationGroup Source # 

Methods

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

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

toConstr :: ReservationUtilizationGroup -> Constr #

dataTypeOf :: ReservationUtilizationGroup -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ReservationUtilizationGroup Source # 
Show ReservationUtilizationGroup Source # 
Generic ReservationUtilizationGroup Source # 
Hashable ReservationUtilizationGroup Source # 
FromJSON ReservationUtilizationGroup Source # 
NFData ReservationUtilizationGroup Source # 
type Rep ReservationUtilizationGroup Source # 
type Rep ReservationUtilizationGroup = D1 * (MetaData "ReservationUtilizationGroup" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "ReservationUtilizationGroup'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rugValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rugKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rugAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe (Map Text Text)))) (S1 * (MetaSel (Just Symbol "_rugUtilization") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe ReservationAggregates))))))

reservationUtilizationGroup :: ReservationUtilizationGroup Source #

Creates a value of ReservationUtilizationGroup with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rugValue :: Lens' ReservationUtilizationGroup (Maybe Text) Source #

The value of a specific RI attribute.

rugKey :: Lens' ReservationUtilizationGroup (Maybe Text) Source #

The key for a specific RI attribute.

rugAttributes :: Lens' ReservationUtilizationGroup (HashMap Text Text) Source #

The attributes for this group of RIs.

ResultByTime

data ResultByTime Source #

The result that is associated with a time period.

See: resultByTime smart constructor.

Instances

Eq ResultByTime Source # 
Data ResultByTime Source # 

Methods

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

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

toConstr :: ResultByTime -> Constr #

dataTypeOf :: ResultByTime -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ResultByTime Source # 
Show ResultByTime Source # 
Generic ResultByTime Source # 

Associated Types

type Rep ResultByTime :: * -> * #

Hashable ResultByTime Source # 
FromJSON ResultByTime Source # 
NFData ResultByTime Source # 

Methods

rnf :: ResultByTime -> () #

type Rep ResultByTime Source # 
type Rep ResultByTime = D1 * (MetaData "ResultByTime" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "ResultByTime'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rbtGroups") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe [Group]))) (S1 * (MetaSel (Just Symbol "_rbtTimePeriod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe DateInterval)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rbtTotal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe (Map Text MetricValue)))) (S1 * (MetaSel (Just Symbol "_rbtEstimated") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Bool))))))

resultByTime :: ResultByTime Source #

Creates a value of ResultByTime with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • rbtGroups - The groups that are included in this time period.
  • rbtTimePeriod - The time period covered by a result.
  • rbtTotal - The total amount of cost or usage accrued during the time period.
  • rbtEstimated - Whether this result is estimated.

rbtGroups :: Lens' ResultByTime [Group] Source #

The groups that are included in this time period.

rbtTimePeriod :: Lens' ResultByTime (Maybe DateInterval) Source #

The time period covered by a result.

rbtTotal :: Lens' ResultByTime (HashMap Text MetricValue) Source #

The total amount of cost or usage accrued during the time period.

rbtEstimated :: Lens' ResultByTime (Maybe Bool) Source #

Whether this result is estimated.

ServiceSpecification

data ServiceSpecification Source #

Hardware specifications for the service that you want recommendations for.

See: serviceSpecification smart constructor.

Instances

Eq ServiceSpecification Source # 
Data ServiceSpecification Source # 

Methods

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

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

toConstr :: ServiceSpecification -> Constr #

dataTypeOf :: ServiceSpecification -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ServiceSpecification Source # 
Show ServiceSpecification Source # 
Generic ServiceSpecification Source # 
Hashable ServiceSpecification Source # 
ToJSON ServiceSpecification Source # 
FromJSON ServiceSpecification Source # 
NFData ServiceSpecification Source # 

Methods

rnf :: ServiceSpecification -> () #

type Rep ServiceSpecification Source # 
type Rep ServiceSpecification = D1 * (MetaData "ServiceSpecification" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" True) (C1 * (MetaCons "ServiceSpecification'" PrefixI True) (S1 * (MetaSel (Just Symbol "_ssEC2Specification") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe EC2Specification))))

serviceSpecification :: ServiceSpecification Source #

Creates a value of ServiceSpecification with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ssEC2Specification - The EC2 hardware specifications that you want AWS to provide recommendations for.

ssEC2Specification :: Lens' ServiceSpecification (Maybe EC2Specification) Source #

The EC2 hardware specifications that you want AWS to provide recommendations for.

TagValues

data TagValues Source #

The values that are available for a tag.

See: tagValues smart constructor.

Instances

Eq TagValues Source # 
Data TagValues Source # 

Methods

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

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

toConstr :: TagValues -> Constr #

dataTypeOf :: TagValues -> DataType #

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

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

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

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

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

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

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

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

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

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

Read TagValues Source # 
Show TagValues Source # 
Generic TagValues Source # 

Associated Types

type Rep TagValues :: * -> * #

Hashable TagValues Source # 
ToJSON TagValues Source # 
NFData TagValues Source # 

Methods

rnf :: TagValues -> () #

type Rep TagValues Source # 
type Rep TagValues = D1 * (MetaData "TagValues" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "TagValues'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_tvValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe [Text]))) (S1 * (MetaSel (Just Symbol "_tvKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))))

tagValues :: TagValues Source #

Creates a value of TagValues with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • tvValues - The specific value of a tag.
  • tvKey - The key for a tag.

tvValues :: Lens' TagValues [Text] Source #

The specific value of a tag.

tvKey :: Lens' TagValues (Maybe Text) Source #

The key for a tag.

UtilizationByTime

data UtilizationByTime Source #

The amount of utilization, in hours.

See: utilizationByTime smart constructor.

Instances

Eq UtilizationByTime Source # 
Data UtilizationByTime Source # 

Methods

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

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

toConstr :: UtilizationByTime -> Constr #

dataTypeOf :: UtilizationByTime -> DataType #

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

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

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

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

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

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

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

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

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

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

Read UtilizationByTime Source # 
Show UtilizationByTime Source # 
Generic UtilizationByTime Source # 
Hashable UtilizationByTime Source # 
FromJSON UtilizationByTime Source # 
NFData UtilizationByTime Source # 

Methods

rnf :: UtilizationByTime -> () #

type Rep UtilizationByTime Source # 
type Rep UtilizationByTime = D1 * (MetaData "UtilizationByTime" "Network.AWS.CostExplorer.Types.Product" "amazonka-cost-explorer-1.6.0-1EmcUb6qhvECvPsx1AQih6" False) (C1 * (MetaCons "UtilizationByTime'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_ubtGroups") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe [ReservationUtilizationGroup]))) ((:*:) * (S1 * (MetaSel (Just Symbol "_ubtTimePeriod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe DateInterval))) (S1 * (MetaSel (Just Symbol "_ubtTotal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe ReservationAggregates))))))

utilizationByTime :: UtilizationByTime Source #

Creates a value of UtilizationByTime with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ubtGroups - The groups that are included in this utilization result.
  • ubtTimePeriod - The period of time over which this utilization was used.
  • ubtTotal - The total number of RI hours that were used.

ubtGroups :: Lens' UtilizationByTime [ReservationUtilizationGroup] Source #

The groups that are included in this utilization result.

ubtTimePeriod :: Lens' UtilizationByTime (Maybe DateInterval) Source #

The period of time over which this utilization was used.

ubtTotal :: Lens' UtilizationByTime (Maybe ReservationAggregates) Source #

The total number of RI hours that were used.