gogol-shopping-content-0.4.0: Google Content API for Shopping SDK.

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

Network.Google.ShoppingContent.Types

Contents

Description

 
Synopsis

Service Configuration

shoppingContentService :: ServiceConfig Source #

Default request referring to version 'v2.1' of the Content API for Shopping. This contains the host and root path used as a starting point for constructing service requests.

OAuth Scopes

contentScope :: Proxy '["https://www.googleapis.com/auth/content"] Source #

Manage your product listings and accounts for Google Shopping

OrdersAcknowledgeRequest

data OrdersAcknowledgeRequest Source #

Instances
Eq OrdersAcknowledgeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersAcknowledgeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrdersAcknowledgeRequest -> Constr #

dataTypeOf :: OrdersAcknowledgeRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrdersAcknowledgeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersAcknowledgeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersAcknowledgeRequest :: Type -> Type #

ToJSON OrdersAcknowledgeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersAcknowledgeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersAcknowledgeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersAcknowledgeRequest = D1 (MetaData "OrdersAcknowledgeRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "OrdersAcknowledgeRequest'" PrefixI True) (S1 (MetaSel (Just "_oarOperationId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

ordersAcknowledgeRequest :: OrdersAcknowledgeRequest Source #

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

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

oarOperationId :: Lens' OrdersAcknowledgeRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

AccountTax

data AccountTax Source #

The tax settings of a merchant account. All methods require the admin role.

See: accountTax smart constructor.

Instances
Eq AccountTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountTax -> Constr #

dataTypeOf :: AccountTax -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountTax :: Type -> Type #

ToJSON AccountTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountTax = D1 (MetaData "AccountTax" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountTax'" PrefixI True) (S1 (MetaSel (Just "_atRules") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountTaxTaxRule])) :*: (S1 (MetaSel (Just "_atKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_atAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))))))

accountTax :: AccountTax Source #

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

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

atRules :: Lens' AccountTax [AccountTaxTaxRule] Source #

Tax rules. Updating the tax rules will enable US taxes (not reversible). Defining no rules is equivalent to not charging tax at all.

atKind :: Lens' AccountTax Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountTax".

atAccountId :: Lens' AccountTax (Maybe Word64) Source #

The ID of the account to which these account tax settings belong.

OrderinvoicesCreateRefundInvoiceResponse

data OrderinvoicesCreateRefundInvoiceResponse Source #

Instances
Eq OrderinvoicesCreateRefundInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderinvoicesCreateRefundInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderinvoicesCreateRefundInvoiceResponse -> Constr #

dataTypeOf :: OrderinvoicesCreateRefundInvoiceResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderinvoicesCreateRefundInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderinvoicesCreateRefundInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderinvoicesCreateRefundInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderinvoicesCreateRefundInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCreateRefundInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCreateRefundInvoiceResponse = D1 (MetaData "OrderinvoicesCreateRefundInvoiceResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderinvoicesCreateRefundInvoiceResponse'" PrefixI True) (S1 (MetaSel (Just "_ocrirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ocrirExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderinvoicesCreateRefundInvoiceResponse :: OrderinvoicesCreateRefundInvoiceResponse Source #

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

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

ocrirKind :: Lens' OrderinvoicesCreateRefundInvoiceResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderinvoicesCreateRefundInvoiceResponse".

OrdersUpdateMerchantOrderIdRequest

data OrdersUpdateMerchantOrderIdRequest Source #

Instances
Eq OrdersUpdateMerchantOrderIdRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersUpdateMerchantOrderIdRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrdersUpdateMerchantOrderIdRequest -> Constr #

dataTypeOf :: OrdersUpdateMerchantOrderIdRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrdersUpdateMerchantOrderIdRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersUpdateMerchantOrderIdRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersUpdateMerchantOrderIdRequest :: Type -> Type #

ToJSON OrdersUpdateMerchantOrderIdRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersUpdateMerchantOrderIdRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateMerchantOrderIdRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateMerchantOrderIdRequest = D1 (MetaData "OrdersUpdateMerchantOrderIdRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersUpdateMerchantOrderIdRequest'" PrefixI True) (S1 (MetaSel (Just "_oumoirMerchantOrderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oumoirOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersUpdateMerchantOrderIdRequest :: OrdersUpdateMerchantOrderIdRequest Source #

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

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

oumoirMerchantOrderId :: Lens' OrdersUpdateMerchantOrderIdRequest (Maybe Text) Source #

The merchant order id to be assigned to the order. Must be unique per merchant.

oumoirOperationId :: Lens' OrdersUpdateMerchantOrderIdRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

OrderReportTransaction

data OrderReportTransaction Source #

Instances
Eq OrderReportTransaction Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderReportTransaction Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderReportTransaction -> Constr #

dataTypeOf :: OrderReportTransaction -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderReportTransaction Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderReportTransaction Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderReportTransaction :: Type -> Type #

ToJSON OrderReportTransaction Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderReportTransaction Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderReportTransaction Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderReportTransaction = D1 (MetaData "OrderReportTransaction" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderReportTransaction'" PrefixI True) (((S1 (MetaSel (Just "_ortMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_ortDisbursementId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ortDisbursementCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ortTransactionDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_ortDisbursementDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ortMerchantOrderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ortProductAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Amount)) :*: (S1 (MetaSel (Just "_ortOrderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ortDisbursementAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)))))))

ortMerchantId :: Lens' OrderReportTransaction (Maybe Word64) Source #

The ID of the managing account.

ortDisbursementCreationDate :: Lens' OrderReportTransaction (Maybe Text) Source #

The date the disbursement was created, in ISO 8601 format.

ortTransactionDate :: Lens' OrderReportTransaction (Maybe Text) Source #

The date of the transaction, in ISO 8601 format.

ortDisbursementDate :: Lens' OrderReportTransaction (Maybe Text) Source #

The date the disbursement was initiated, in ISO 8601 format.

ortMerchantOrderId :: Lens' OrderReportTransaction (Maybe Text) Source #

Merchant-provided id of the order.

OrdersAdvanceTestOrderResponse

data OrdersAdvanceTestOrderResponse Source #

Instances
Eq OrdersAdvanceTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersAdvanceTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrdersAdvanceTestOrderResponse -> Constr #

dataTypeOf :: OrdersAdvanceTestOrderResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrdersAdvanceTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersAdvanceTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersAdvanceTestOrderResponse :: Type -> Type #

ToJSON OrdersAdvanceTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersAdvanceTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersAdvanceTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersAdvanceTestOrderResponse = D1 (MetaData "OrdersAdvanceTestOrderResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "OrdersAdvanceTestOrderResponse'" PrefixI True) (S1 (MetaSel (Just "_oatorKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

ordersAdvanceTestOrderResponse :: OrdersAdvanceTestOrderResponse Source #

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

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

oatorKind :: Lens' OrdersAdvanceTestOrderResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersAdvanceTestOrderResponse".

ProductsCustomBatchResponse

data ProductsCustomBatchResponse Source #

Instances
Eq ProductsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: ProductsCustomBatchResponse -> Constr #

dataTypeOf :: ProductsCustomBatchResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ProductsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductsCustomBatchResponse :: Type -> Type #

ToJSON ProductsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsCustomBatchResponse = D1 (MetaData "ProductsCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductsCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_pcbrEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ProductsCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_pcbrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

productsCustomBatchResponse :: ProductsCustomBatchResponse Source #

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

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

pcbrEntries :: Lens' ProductsCustomBatchResponse [ProductsCustomBatchResponseEntry] Source #

The result of the execution of the batch requests.

pcbrKind :: Lens' ProductsCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#productsCustomBatchResponse".

OrderMerchantProvidedAnnotation

data OrderMerchantProvidedAnnotation Source #

Instances
Eq OrderMerchantProvidedAnnotation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderMerchantProvidedAnnotation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderMerchantProvidedAnnotation -> Constr #

dataTypeOf :: OrderMerchantProvidedAnnotation -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderMerchantProvidedAnnotation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderMerchantProvidedAnnotation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderMerchantProvidedAnnotation :: Type -> Type #

ToJSON OrderMerchantProvidedAnnotation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderMerchantProvidedAnnotation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderMerchantProvidedAnnotation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderMerchantProvidedAnnotation = D1 (MetaData "OrderMerchantProvidedAnnotation" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderMerchantProvidedAnnotation'" PrefixI True) (S1 (MetaSel (Just "_ompaValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ompaKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderMerchantProvidedAnnotation :: OrderMerchantProvidedAnnotation Source #

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

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

ompaValue :: Lens' OrderMerchantProvidedAnnotation (Maybe Text) Source #

Value for additional merchant provided (as key-value pairs) annotation about the line item.

ompaKey :: Lens' OrderMerchantProvidedAnnotation (Maybe Text) Source #

Key for additional merchant provided (as key-value pairs) annotation about the line item.

OrdersGettestOrdertemplateTemplateName

data OrdersGettestOrdertemplateTemplateName Source #

The name of the template to retrieve.

Constructors

TEMPLATE1
template1
Template1a
template1a
Template1b
template1b
TEMPLATE2
template2
Instances
Enum OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Eq OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Data OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Methods

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

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

toConstr :: OrdersGettestOrdertemplateTemplateName -> Constr #

dataTypeOf :: OrdersGettestOrdertemplateTemplateName -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Read OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Show OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Generic OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Hashable OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

ToJSON OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

FromJSON OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

FromHttpApiData OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

ToHttpApiData OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

type Rep OrdersGettestOrdertemplateTemplateName Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

type Rep OrdersGettestOrdertemplateTemplateName = D1 (MetaData "OrdersGettestOrdertemplateTemplateName" "Network.Google.ShoppingContent.Types.Sum" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) ((C1 (MetaCons "TEMPLATE1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Template1a" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Template1b" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TEMPLATE2" PrefixI False) (U1 :: Type -> Type)))

TestOrderCustomer

data TestOrderCustomer Source #

Instances
Eq TestOrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data TestOrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: TestOrderCustomer -> Constr #

dataTypeOf :: TestOrderCustomer -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TestOrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic TestOrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep TestOrderCustomer :: Type -> Type #

ToJSON TestOrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON TestOrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrderCustomer = D1 (MetaData "TestOrderCustomer" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "TestOrderCustomer'" PrefixI True) (S1 (MetaSel (Just "_tocFullName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_tocEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tocMarketingRightsInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TestOrderCustomerMarketingRightsInfo)))))

testOrderCustomer :: TestOrderCustomer Source #

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

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

tocFullName :: Lens' TestOrderCustomer (Maybe Text) Source #

Full name of the customer.

DatafeedstatusesCustomBatchResponse

data DatafeedstatusesCustomBatchResponse Source #

Instances
Eq DatafeedstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: DatafeedstatusesCustomBatchResponse -> Constr #

dataTypeOf :: DatafeedstatusesCustomBatchResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DatafeedstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON DatafeedstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesCustomBatchResponse = D1 (MetaData "DatafeedstatusesCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedstatusesCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_dcbrEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DatafeedstatusesCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_dcbrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

datafeedstatusesCustomBatchResponse :: DatafeedstatusesCustomBatchResponse Source #

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

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

dcbrKind :: Lens' DatafeedstatusesCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#datafeedstatusesCustomBatchResponse".

OrderReturn

data OrderReturn Source #

Instances
Eq OrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderReturn -> Constr #

dataTypeOf :: OrderReturn -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderReturn :: Type -> Type #

ToJSON OrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderReturn = D1 (MetaData "OrderReturn" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderReturn'" PrefixI True) ((S1 (MetaSel (Just "_orQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_orActor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_orReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_orCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_orReasonText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

orderReturn :: OrderReturn Source #

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

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

orQuantity :: Lens' OrderReturn (Maybe Word32) Source #

Quantity that is returned.

orActor :: Lens' OrderReturn (Maybe Text) Source #

The actor that created the refund.

orReason :: Lens' OrderReturn (Maybe Text) Source #

The reason for the return.

orCreationDate :: Lens' OrderReturn (Maybe Text) Source #

Date on which the item has been created, in ISO 8601 format.

orReasonText :: Lens' OrderReturn (Maybe Text) Source #

The explanation of the reason.

AccounttaxCustomBatchResponseEntry

data AccounttaxCustomBatchResponseEntry Source #

A batch entry encoding a single non-batch accounttax response.

See: accounttaxCustomBatchResponseEntry smart constructor.

Instances
Eq AccounttaxCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccounttaxCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccounttaxCustomBatchResponseEntry -> Constr #

dataTypeOf :: AccounttaxCustomBatchResponseEntry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccounttaxCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccounttaxCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccounttaxCustomBatchResponseEntry :: Type -> Type #

ToJSON AccounttaxCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccounttaxCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxCustomBatchResponseEntry = D1 (MetaData "AccounttaxCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccounttaxCustomBatchResponseEntry'" PrefixI True) ((S1 (MetaSel (Just "_acbreAccountTax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AccountTax)) :*: S1 (MetaSel (Just "_acbreKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) :*: (S1 (MetaSel (Just "_acbreErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: S1 (MetaSel (Just "_acbreBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

accounttaxCustomBatchResponseEntry :: AccounttaxCustomBatchResponseEntry Source #

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

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

acbreAccountTax :: Lens' AccounttaxCustomBatchResponseEntry (Maybe AccountTax) Source #

The retrieved or updated account tax settings.

acbreKind :: Lens' AccounttaxCustomBatchResponseEntry Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accounttaxCustomBatchResponseEntry".

acbreErrors :: Lens' AccounttaxCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if and only if the request failed.

acbreBatchId :: Lens' AccounttaxCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry this entry responds to.

PosSaleResponse

data PosSaleResponse Source #

Instances
Eq PosSaleResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosSaleResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: PosSaleResponse -> Constr #

dataTypeOf :: PosSaleResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PosSaleResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosSaleResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosSaleResponse :: Type -> Type #

ToJSON PosSaleResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosSaleResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosSaleResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

posSaleResponse :: PosSaleResponse Source #

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

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

psrStoreCode :: Lens' PosSaleResponse (Maybe Text) Source #

The identifier of the merchant's store. Either a storeCode inserted via the API or the code of the store in Google My Business.

psrKind :: Lens' PosSaleResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#posSaleResponse".

psrItemId :: Lens' PosSaleResponse (Maybe Text) Source #

A unique identifier for the item.

psrQuantity :: Lens' PosSaleResponse (Maybe Int64) Source #

The relative change of the available quantity. Negative for items returned.

psrTargetCountry :: Lens' PosSaleResponse (Maybe Text) Source #

The CLDR territory code for the item.

psrGtin :: Lens' PosSaleResponse (Maybe Text) Source #

Global Trade Item Number.

psrPrice :: Lens' PosSaleResponse (Maybe Price) Source #

The price of the item.

psrContentLanguage :: Lens' PosSaleResponse (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

psrTimestamp :: Lens' PosSaleResponse (Maybe Text) Source #

The inventory timestamp, in ISO 8601 format.

psrSaleId :: Lens' PosSaleResponse (Maybe Text) Source #

A unique ID to group items from the same sale event.

Amount

data Amount Source #

Instances
Eq Amount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

Data Amount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: Amount -> Constr #

dataTypeOf :: Amount -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Amount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Amount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Amount :: Type -> Type #

Methods

from :: Amount -> Rep Amount x #

to :: Rep Amount x -> Amount #

ToJSON Amount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Amount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Amount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Amount = D1 (MetaData "Amount" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Amount'" PrefixI True) (S1 (MetaSel (Just "_aPretax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_aTax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))))

amount :: Amount Source #

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

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

aPretax :: Lens' Amount (Maybe Price) Source #

required
Value before taxes.

aTax :: Lens' Amount (Maybe Price) Source #

required
Tax value.

AccountsAuthInfoResponse

data AccountsAuthInfoResponse Source #

Instances
Eq AccountsAuthInfoResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsAuthInfoResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountsAuthInfoResponse -> Constr #

dataTypeOf :: AccountsAuthInfoResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountsAuthInfoResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsAuthInfoResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsAuthInfoResponse :: Type -> Type #

ToJSON AccountsAuthInfoResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsAuthInfoResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsAuthInfoResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsAuthInfoResponse = D1 (MetaData "AccountsAuthInfoResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountsAuthInfoResponse'" PrefixI True) (S1 (MetaSel (Just "_aairKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_aairAccountIdentifiers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountIdentifier]))))

accountsAuthInfoResponse :: AccountsAuthInfoResponse Source #

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

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

aairKind :: Lens' AccountsAuthInfoResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountsAuthInfoResponse".

aairAccountIdentifiers :: Lens' AccountsAuthInfoResponse [AccountIdentifier] Source #

The account identifiers corresponding to the authenticated user. - For an individual account: only the merchant ID is defined - For an aggregator: only the aggregator ID is defined - For a subaccount of an MCA: both the merchant ID and the aggregator ID are defined.

OrderReportDisbursement

data OrderReportDisbursement Source #

Order disbursement. All methods require the payment analyst role.

See: orderReportDisbursement smart constructor.

Instances
Eq OrderReportDisbursement Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderReportDisbursement Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderReportDisbursement -> Constr #

dataTypeOf :: OrderReportDisbursement -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderReportDisbursement Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderReportDisbursement Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderReportDisbursement :: Type -> Type #

ToJSON OrderReportDisbursement Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderReportDisbursement Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderReportDisbursement Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderReportDisbursement = D1 (MetaData "OrderReportDisbursement" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderReportDisbursement'" PrefixI True) ((S1 (MetaSel (Just "_ordMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_ordDisbursementId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ordDisbursementCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ordDisbursementDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ordDisbursementAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))))))

orderReportDisbursement :: OrderReportDisbursement Source #

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

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

ordMerchantId :: Lens' OrderReportDisbursement (Maybe Word64) Source #

The ID of the managing account.

ordDisbursementCreationDate :: Lens' OrderReportDisbursement (Maybe Text) Source #

The disbursement date, in ISO 8601 format.

ordDisbursementDate :: Lens' OrderReportDisbursement (Maybe Text) Source #

The date the disbursement was initiated, in ISO 8601 format.

UnitInvoice

data UnitInvoice Source #

Instances
Eq UnitInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data UnitInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: UnitInvoice -> Constr #

dataTypeOf :: UnitInvoice -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UnitInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic UnitInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep UnitInvoice :: Type -> Type #

ToJSON UnitInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON UnitInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep UnitInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep UnitInvoice = D1 (MetaData "UnitInvoice" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "UnitInvoice'" PrefixI True) ((S1 (MetaSel (Just "_uiUnitPriceTaxes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [UnitInvoiceTaxLine])) :*: S1 (MetaSel (Just "_uiPromotions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Promotion]))) :*: (S1 (MetaSel (Just "_uiAdditionalCharges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [UnitInvoiceAdditionalCharge])) :*: S1 (MetaSel (Just "_uiUnitPricePretax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)))))

unitInvoice :: UnitInvoice Source #

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

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

uiUnitPriceTaxes :: Lens' UnitInvoice [UnitInvoiceTaxLine] Source #

Tax amounts to apply to the unit price.

uiPromotions :: Lens' UnitInvoice [Promotion] Source #

Promotions applied to a unit.

uiAdditionalCharges :: Lens' UnitInvoice [UnitInvoiceAdditionalCharge] Source #

Additional charges for a unit, e.g. shipping costs.

uiUnitPricePretax :: Lens' UnitInvoice (Maybe Price) Source #

required
Price of the unit, before applying taxes.

PosSale

data PosSale Source #

The change of the available quantity of an item at the given store.

See: posSale smart constructor.

Instances
Eq PosSale Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

Data PosSale Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: PosSale -> Constr #

dataTypeOf :: PosSale -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PosSale Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosSale Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosSale :: Type -> Type #

Methods

from :: PosSale -> Rep PosSale x #

to :: Rep PosSale x -> PosSale #

ToJSON PosSale Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosSale Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosSale Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

posSale :: PosSale Source #

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

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

psStoreCode :: Lens' PosSale (Maybe Text) Source #

The identifier of the merchant's store. Either a storeCode inserted via the API or the code of the store in Google My Business.

psKind :: Lens' PosSale Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#posSale".

psItemId :: Lens' PosSale (Maybe Text) Source #

A unique identifier for the item.

psQuantity :: Lens' PosSale (Maybe Int64) Source #

The relative change of the available quantity. Negative for items returned.

psTargetCountry :: Lens' PosSale (Maybe Text) Source #

The CLDR territory code for the item.

psGtin :: Lens' PosSale (Maybe Text) Source #

Global Trade Item Number.

psPrice :: Lens' PosSale (Maybe Price) Source #

The price of the item.

psContentLanguage :: Lens' PosSale (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

psTimestamp :: Lens' PosSale (Maybe Text) Source #

The inventory timestamp, in ISO 8601 format.

psSaleId :: Lens' PosSale (Maybe Text) Source #

A unique ID to group items from the same sale event.

AccountStatusItemLevelIssue

data AccountStatusItemLevelIssue Source #

Instances
Eq AccountStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountStatusItemLevelIssue -> Constr #

dataTypeOf :: AccountStatusItemLevelIssue -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountStatusItemLevelIssue :: Type -> Type #

ToJSON AccountStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatusItemLevelIssue = D1 (MetaData "AccountStatusItemLevelIssue" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountStatusItemLevelIssue'" PrefixI True) (((S1 (MetaSel (Just "_asiliNumItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_asiliResolution") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_asiliDocumentation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asiliCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_asiliServability") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asiliAttributeName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_asiliDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asiliDetail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

accountStatusItemLevelIssue :: AccountStatusItemLevelIssue Source #

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

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

asiliNumItems :: Lens' AccountStatusItemLevelIssue (Maybe Int64) Source #

Number of items with this issue.

asiliResolution :: Lens' AccountStatusItemLevelIssue (Maybe Text) Source #

Whether the issue can be resolved by the merchant.

asiliDocumentation :: Lens' AccountStatusItemLevelIssue (Maybe Text) Source #

The URL of a web page to help with resolving this issue.

asiliCode :: Lens' AccountStatusItemLevelIssue (Maybe Text) Source #

The error code of the issue.

asiliServability :: Lens' AccountStatusItemLevelIssue (Maybe Text) Source #

How this issue affects serving of the offer.

asiliAttributeName :: Lens' AccountStatusItemLevelIssue (Maybe Text) Source #

The attribute's name, if the issue is caused by a single attribute.

asiliDescription :: Lens' AccountStatusItemLevelIssue (Maybe Text) Source #

A short issue description in English.

asiliDetail :: Lens' AccountStatusItemLevelIssue (Maybe Text) Source #

A detailed issue description in English.

LiaSettingsRequestGmbAccessResponse

data LiaSettingsRequestGmbAccessResponse Source #

Instances
Eq LiaSettingsRequestGmbAccessResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsRequestGmbAccessResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: LiaSettingsRequestGmbAccessResponse -> Constr #

dataTypeOf :: LiaSettingsRequestGmbAccessResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LiaSettingsRequestGmbAccessResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsRequestGmbAccessResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON LiaSettingsRequestGmbAccessResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsRequestGmbAccessResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsRequestGmbAccessResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsRequestGmbAccessResponse = D1 (MetaData "LiaSettingsRequestGmbAccessResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "LiaSettingsRequestGmbAccessResponse'" PrefixI True) (S1 (MetaSel (Just "_lsrgarKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

liaSettingsRequestGmbAccessResponse :: LiaSettingsRequestGmbAccessResponse Source #

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

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

lsrgarKind :: Lens' LiaSettingsRequestGmbAccessResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsRequestGmbAccessResponse".

ProductStatusDestinationStatus

data ProductStatusDestinationStatus Source #

Instances
Eq ProductStatusDestinationStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductStatusDestinationStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: ProductStatusDestinationStatus -> Constr #

dataTypeOf :: ProductStatusDestinationStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ProductStatusDestinationStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductStatusDestinationStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductStatusDestinationStatus :: Type -> Type #

ToJSON ProductStatusDestinationStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductStatusDestinationStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductStatusDestinationStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductStatusDestinationStatus = D1 (MetaData "ProductStatusDestinationStatus" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductStatusDestinationStatus'" PrefixI True) (S1 (MetaSel (Just "_psdsDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psdsStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

productStatusDestinationStatus :: ProductStatusDestinationStatus Source #

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

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

AccountTaxTaxRule

data AccountTaxTaxRule Source #

Tax calculation rule to apply in a state or province (USA only).

See: accountTaxTaxRule smart constructor.

Instances
Eq AccountTaxTaxRule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountTaxTaxRule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountTaxTaxRule -> Constr #

dataTypeOf :: AccountTaxTaxRule -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountTaxTaxRule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountTaxTaxRule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountTaxTaxRule :: Type -> Type #

ToJSON AccountTaxTaxRule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountTaxTaxRule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountTaxTaxRule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountTaxTaxRule = D1 (MetaData "AccountTaxTaxRule" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountTaxTaxRule'" PrefixI True) ((S1 (MetaSel (Just "_attrUseGlobalRate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_attrCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_attrShippingTaxed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_attrLocationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_attrRatePercent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

accountTaxTaxRule :: AccountTaxTaxRule Source #

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

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

attrUseGlobalRate :: Lens' AccountTaxTaxRule (Maybe Bool) Source #

Whether the tax rate is taken from a global tax table or specified explicitly.

attrCountry :: Lens' AccountTaxTaxRule (Maybe Text) Source #

Country code in which tax is applicable.

attrShippingTaxed :: Lens' AccountTaxTaxRule (Maybe Bool) Source #

If true, shipping charges are also taxed.

attrLocationId :: Lens' AccountTaxTaxRule (Maybe Word64) Source #

State (or province) is which the tax is applicable, described by its location id (also called criteria id).

attrRatePercent :: Lens' AccountTaxTaxRule (Maybe Text) Source #

Explicit tax rate in percent, represented as a floating point number without the percentage character. Must not be negative.

PostalCodeGroup

data PostalCodeGroup Source #

Instances
Eq PostalCodeGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PostalCodeGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: PostalCodeGroup -> Constr #

dataTypeOf :: PostalCodeGroup -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PostalCodeGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PostalCodeGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PostalCodeGroup :: Type -> Type #

ToJSON PostalCodeGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PostalCodeGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PostalCodeGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PostalCodeGroup = D1 (MetaData "PostalCodeGroup" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PostalCodeGroup'" PrefixI True) (S1 (MetaSel (Just "_pcgCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_pcgPostalCodeRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PostalCodeRange])) :*: S1 (MetaSel (Just "_pcgName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

postalCodeGroup :: PostalCodeGroup Source #

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

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

pcgCountry :: Lens' PostalCodeGroup (Maybe Text) Source #

The CLDR territory code of the country the postal code group applies to. Required.

pcgPostalCodeRanges :: Lens' PostalCodeGroup [PostalCodeRange] Source #

A range of postal codes. Required.

pcgName :: Lens' PostalCodeGroup (Maybe Text) Source #

The name of the postal code group, referred to in headers. Required.

DatafeedsCustomBatchRequest

data DatafeedsCustomBatchRequest Source #

Instances
Eq DatafeedsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: DatafeedsCustomBatchRequest -> Constr #

dataTypeOf :: DatafeedsCustomBatchRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DatafeedsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedsCustomBatchRequest :: Type -> Type #

ToJSON DatafeedsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsCustomBatchRequest = D1 (MetaData "DatafeedsCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "DatafeedsCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_dEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DatafeedsCustomBatchRequestEntry]))))

datafeedsCustomBatchRequest :: DatafeedsCustomBatchRequest Source #

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

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

dEntries :: Lens' DatafeedsCustomBatchRequest [DatafeedsCustomBatchRequestEntry] Source #

The request entries to be processed in the batch.

OrderpaymentsNotifyChargeRequest

data OrderpaymentsNotifyChargeRequest Source #

Instances
Eq OrderpaymentsNotifyChargeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderpaymentsNotifyChargeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderpaymentsNotifyChargeRequest -> Constr #

dataTypeOf :: OrderpaymentsNotifyChargeRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderpaymentsNotifyChargeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderpaymentsNotifyChargeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderpaymentsNotifyChargeRequest :: Type -> Type #

ToJSON OrderpaymentsNotifyChargeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderpaymentsNotifyChargeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyChargeRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyChargeRequest = D1 (MetaData "OrderpaymentsNotifyChargeRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderpaymentsNotifyChargeRequest'" PrefixI True) (S1 (MetaSel (Just "_oncrInvoiceIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_oncrChargeState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderpaymentsNotifyChargeRequest :: OrderpaymentsNotifyChargeRequest Source #

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

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

oncrInvoiceIds :: Lens' OrderpaymentsNotifyChargeRequest [Text] Source #

Invoice IDs from the orderinvoices service that correspond to the charge.

OrdersCancelTestOrderByCustomerResponse

data OrdersCancelTestOrderByCustomerResponse Source #

Instances
Eq OrdersCancelTestOrderByCustomerResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCancelTestOrderByCustomerResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrdersCancelTestOrderByCustomerResponse -> Constr #

dataTypeOf :: OrdersCancelTestOrderByCustomerResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrdersCancelTestOrderByCustomerResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCancelTestOrderByCustomerResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrdersCancelTestOrderByCustomerResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCancelTestOrderByCustomerResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelTestOrderByCustomerResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelTestOrderByCustomerResponse = D1 (MetaData "OrdersCancelTestOrderByCustomerResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "OrdersCancelTestOrderByCustomerResponse'" PrefixI True) (S1 (MetaSel (Just "_octobcrKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

ordersCancelTestOrderByCustomerResponse :: OrdersCancelTestOrderByCustomerResponse Source #

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

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

octobcrKind :: Lens' OrdersCancelTestOrderByCustomerResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersCancelTestOrderByCustomerResponse".

LiaOnDisplayToOrderSettings

data LiaOnDisplayToOrderSettings Source #

Instances
Eq LiaOnDisplayToOrderSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaOnDisplayToOrderSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: LiaOnDisplayToOrderSettings -> Constr #

dataTypeOf :: LiaOnDisplayToOrderSettings -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LiaOnDisplayToOrderSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaOnDisplayToOrderSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaOnDisplayToOrderSettings :: Type -> Type #

ToJSON LiaOnDisplayToOrderSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaOnDisplayToOrderSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaOnDisplayToOrderSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaOnDisplayToOrderSettings = D1 (MetaData "LiaOnDisplayToOrderSettings" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaOnDisplayToOrderSettings'" PrefixI True) (S1 (MetaSel (Just "_lodtosStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lodtosShippingCostPolicyURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

liaOnDisplayToOrderSettings :: LiaOnDisplayToOrderSettings Source #

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

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

lodtosStatus :: Lens' LiaOnDisplayToOrderSettings (Maybe Text) Source #

The status of the ?On display to order? feature.

OrderpaymentsNotifyAuthDeclinedResponse

data OrderpaymentsNotifyAuthDeclinedResponse Source #

Instances
Eq OrderpaymentsNotifyAuthDeclinedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderpaymentsNotifyAuthDeclinedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderpaymentsNotifyAuthDeclinedResponse -> Constr #

dataTypeOf :: OrderpaymentsNotifyAuthDeclinedResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderpaymentsNotifyAuthDeclinedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderpaymentsNotifyAuthDeclinedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderpaymentsNotifyAuthDeclinedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderpaymentsNotifyAuthDeclinedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyAuthDeclinedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyAuthDeclinedResponse = D1 (MetaData "OrderpaymentsNotifyAuthDeclinedResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderpaymentsNotifyAuthDeclinedResponse'" PrefixI True) (S1 (MetaSel (Just "_onadrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_onadrExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderpaymentsNotifyAuthDeclinedResponse :: OrderpaymentsNotifyAuthDeclinedResponse Source #

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

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

onadrKind :: Lens' OrderpaymentsNotifyAuthDeclinedResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderpaymentsNotifyAuthDeclinedResponse".

AccountAddress

data AccountAddress Source #

Instances
Eq AccountAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountAddress -> Constr #

dataTypeOf :: AccountAddress -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountAddress :: Type -> Type #

ToJSON AccountAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountAddress = D1 (MetaData "AccountAddress" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountAddress'" PrefixI True) ((S1 (MetaSel (Just "_aaStreetAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aaCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_aaPostalCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_aaLocality") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aaRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

accountAddress :: AccountAddress Source #

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

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

aaStreetAddress :: Lens' AccountAddress (Maybe Text) Source #

Street-level part of the address.

aaCountry :: Lens' AccountAddress (Maybe Text) Source #

CLDR country code (e.g. "US").

aaPostalCode :: Lens' AccountAddress (Maybe Text) Source #

Postal code or ZIP (e.g. "94043").

aaLocality :: Lens' AccountAddress (Maybe Text) Source #

City, town or commune. May also include dependent localities or sublocalities (e.g. neighborhoods or suburbs).

aaRegion :: Lens' AccountAddress (Maybe Text) Source #

Top-level administrative subdivision of the country. For example, a state like California ("CA") or a province like Quebec ("QC").

InvoiceSummaryAdditionalChargeSummary

data InvoiceSummaryAdditionalChargeSummary Source #

Instances
Eq InvoiceSummaryAdditionalChargeSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data InvoiceSummaryAdditionalChargeSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: InvoiceSummaryAdditionalChargeSummary -> Constr #

dataTypeOf :: InvoiceSummaryAdditionalChargeSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Show InvoiceSummaryAdditionalChargeSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic InvoiceSummaryAdditionalChargeSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON InvoiceSummaryAdditionalChargeSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON InvoiceSummaryAdditionalChargeSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep InvoiceSummaryAdditionalChargeSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep InvoiceSummaryAdditionalChargeSummary = D1 (MetaData "InvoiceSummaryAdditionalChargeSummary" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "InvoiceSummaryAdditionalChargeSummary'" PrefixI True) (S1 (MetaSel (Just "_isacsTotalAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Amount)) :*: S1 (MetaSel (Just "_isacsType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

invoiceSummaryAdditionalChargeSummary :: InvoiceSummaryAdditionalChargeSummary Source #

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

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

isacsTotalAmount :: Lens' InvoiceSummaryAdditionalChargeSummary (Maybe Amount) Source #

required
Total additional charge for this type.

isacsType :: Lens' InvoiceSummaryAdditionalChargeSummary (Maybe Text) Source #

required
Type of the additional charge.

RefundReason

data RefundReason Source #

Instances
Eq RefundReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data RefundReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: RefundReason -> Constr #

dataTypeOf :: RefundReason -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RefundReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic RefundReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep RefundReason :: Type -> Type #

ToJSON RefundReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON RefundReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep RefundReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep RefundReason = D1 (MetaData "RefundReason" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "RefundReason'" PrefixI True) (S1 (MetaSel (Just "_rrReasonCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rrDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

refundReason :: RefundReason Source #

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

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

OrderLineItemShippingDetailsMethod

data OrderLineItemShippingDetailsMethod Source #

Instances
Eq OrderLineItemShippingDetailsMethod Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderLineItemShippingDetailsMethod Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderLineItemShippingDetailsMethod -> Constr #

dataTypeOf :: OrderLineItemShippingDetailsMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderLineItemShippingDetailsMethod Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderLineItemShippingDetailsMethod Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderLineItemShippingDetailsMethod :: Type -> Type #

ToJSON OrderLineItemShippingDetailsMethod Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderLineItemShippingDetailsMethod Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemShippingDetailsMethod Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemShippingDetailsMethod = D1 (MetaData "OrderLineItemShippingDetailsMethod" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderLineItemShippingDetailsMethod'" PrefixI True) ((S1 (MetaSel (Just "_olisdmCarrier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olisdmMethodName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_olisdmMaxDaysInTransit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_olisdmMinDaysInTransit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

orderLineItemShippingDetailsMethod :: OrderLineItemShippingDetailsMethod Source #

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

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

olisdmCarrier :: Lens' OrderLineItemShippingDetailsMethod (Maybe Text) Source #

The carrier for the shipping. Optional. See shipments[].carrier for a list of acceptable values.

Datafeed

data Datafeed Source #

Datafeed configuration data.

See: datafeed smart constructor.

Instances
Eq Datafeed Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data Datafeed Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: Datafeed -> Constr #

dataTypeOf :: Datafeed -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Datafeed Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Datafeed Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Datafeed :: Type -> Type #

Methods

from :: Datafeed -> Rep Datafeed x #

to :: Rep Datafeed x -> Datafeed #

ToJSON Datafeed Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Datafeed Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Datafeed Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

datafeed :: Datafeed Source #

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

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

dKind :: Lens' Datafeed Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#datafeed".

dFormat :: Lens' Datafeed (Maybe DatafeedFormat) Source #

Format of the feed file.

dAttributeLanguage :: Lens' Datafeed (Maybe Text) Source #

The two-letter ISO 639-1 language in which the attributes are defined in the data feed.

dFetchSchedule :: Lens' Datafeed (Maybe DatafeedFetchSchedule) Source #

Fetch schedule for the feed file.

dName :: Lens' Datafeed (Maybe Text) Source #

A descriptive name of the data feed.

dTargets :: Lens' Datafeed [DatafeedTarget] Source #

The targets this feed should apply to (country, language, destinations).

dId :: Lens' Datafeed (Maybe Int64) Source #

The ID of the data feed.

dContentType :: Lens' Datafeed (Maybe Text) Source #

The type of data feed. For product inventory feeds, only feeds for local stores, not online stores, are supported.

dFileName :: Lens' Datafeed (Maybe Text) Source #

The filename of the feed. All feeds must have a unique file name.

OrdersCreateTestOrderResponse

data OrdersCreateTestOrderResponse Source #

Instances
Eq OrdersCreateTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCreateTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrdersCreateTestOrderResponse -> Constr #

dataTypeOf :: OrdersCreateTestOrderResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrdersCreateTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCreateTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersCreateTestOrderResponse :: Type -> Type #

ToJSON OrdersCreateTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCreateTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCreateTestOrderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCreateTestOrderResponse = D1 (MetaData "OrdersCreateTestOrderResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCreateTestOrderResponse'" PrefixI True) (S1 (MetaSel (Just "_octorKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_octorOrderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersCreateTestOrderResponse :: OrdersCreateTestOrderResponse Source #

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

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

octorKind :: Lens' OrdersCreateTestOrderResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersCreateTestOrderResponse".

octorOrderId :: Lens' OrdersCreateTestOrderResponse (Maybe Text) Source #

The ID of the newly created test order.

AccountsCustomBatchResponseEntry

data AccountsCustomBatchResponseEntry Source #

A batch entry encoding a single non-batch accounts response.

See: accountsCustomBatchResponseEntry smart constructor.

Instances
Eq AccountsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountsCustomBatchResponseEntry -> Constr #

dataTypeOf :: AccountsCustomBatchResponseEntry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsCustomBatchResponseEntry :: Type -> Type #

ToJSON AccountsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchResponseEntry = D1 (MetaData "AccountsCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountsCustomBatchResponseEntry'" PrefixI True) ((S1 (MetaSel (Just "_aKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_aAccount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Account))) :*: (S1 (MetaSel (Just "_aErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: S1 (MetaSel (Just "_aBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

accountsCustomBatchResponseEntry :: AccountsCustomBatchResponseEntry Source #

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

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

aKind :: Lens' AccountsCustomBatchResponseEntry Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountsCustomBatchResponseEntry".

aAccount :: Lens' AccountsCustomBatchResponseEntry (Maybe Account) Source #

The retrieved, created, or updated account. Not defined if the method was delete, claimwebsite or link.

aErrors :: Lens' AccountsCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if and only if the request failed.

aBatchId :: Lens' AccountsCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry this entry responds to.

OrdersListOrderBy

data OrdersListOrderBy Source #

The ordering of the returned list. The only supported value are placedDate desc and placedDate asc for now, which returns orders sorted by placement date. "placedDate desc" stands for listing orders by placement date, from oldest to most recent. "placedDate asc" stands for listing orders by placement date, from most recent to oldest. In future releases we'll support other sorting criteria.

Constructors

PlacedDateAsc
placedDate asc
PlacedDateDesc
placedDate desc
Instances
Enum OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Eq OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Data OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Methods

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

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

toConstr :: OrdersListOrderBy -> Constr #

dataTypeOf :: OrdersListOrderBy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Read OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Show OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Generic OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Associated Types

type Rep OrdersListOrderBy :: Type -> Type #

Hashable OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

ToJSON OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

FromJSON OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

FromHttpApiData OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

ToHttpApiData OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

type Rep OrdersListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

type Rep OrdersListOrderBy = D1 (MetaData "OrdersListOrderBy" "Network.Google.ShoppingContent.Types.Sum" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PlacedDateAsc" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PlacedDateDesc" PrefixI False) (U1 :: Type -> Type))

GmbAccounts

data GmbAccounts Source #

Instances
Eq GmbAccounts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data GmbAccounts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: GmbAccounts -> Constr #

dataTypeOf :: GmbAccounts -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GmbAccounts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic GmbAccounts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep GmbAccounts :: Type -> Type #

ToJSON GmbAccounts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON GmbAccounts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep GmbAccounts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep GmbAccounts = D1 (MetaData "GmbAccounts" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "GmbAccounts'" PrefixI True) (S1 (MetaSel (Just "_gaGmbAccounts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GmbAccountsGmbAccount])) :*: S1 (MetaSel (Just "_gaAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))))

gmbAccounts :: GmbAccounts Source #

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

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

gaGmbAccounts :: Lens' GmbAccounts [GmbAccountsGmbAccount] Source #

A list of GMB accounts which are available to the merchant.

gaAccountId :: Lens' GmbAccounts (Maybe Word64) Source #

The ID of the account.

CustomerReturnReason

data CustomerReturnReason Source #

Instances
Eq CustomerReturnReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data CustomerReturnReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: CustomerReturnReason -> Constr #

dataTypeOf :: CustomerReturnReason -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CustomerReturnReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic CustomerReturnReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep CustomerReturnReason :: Type -> Type #

ToJSON CustomerReturnReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON CustomerReturnReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CustomerReturnReason Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CustomerReturnReason = D1 (MetaData "CustomerReturnReason" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "CustomerReturnReason'" PrefixI True) (S1 (MetaSel (Just "_crrReasonCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_crrDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

customerReturnReason :: CustomerReturnReason Source #

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

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

AccountIdentifier

data AccountIdentifier Source #

Instances
Eq AccountIdentifier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountIdentifier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountIdentifier -> Constr #

dataTypeOf :: AccountIdentifier -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountIdentifier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountIdentifier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountIdentifier :: Type -> Type #

ToJSON AccountIdentifier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountIdentifier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountIdentifier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountIdentifier = D1 (MetaData "AccountIdentifier" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountIdentifier'" PrefixI True) (S1 (MetaSel (Just "_aiMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_aiAggregatorId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))))

accountIdentifier :: AccountIdentifier Source #

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

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

aiMerchantId :: Lens' AccountIdentifier (Maybe Word64) Source #

The merchant account ID, set for individual accounts and subaccounts.

aiAggregatorId :: Lens' AccountIdentifier (Maybe Word64) Source #

The aggregator ID, set for aggregators and subaccounts (in that case, it represents the aggregator of the subaccount).

PosCustomBatchRequest

data PosCustomBatchRequest Source #

Instances
Eq PosCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: PosCustomBatchRequest -> Constr #

dataTypeOf :: PosCustomBatchRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PosCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosCustomBatchRequest :: Type -> Type #

ToJSON PosCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosCustomBatchRequest = D1 (MetaData "PosCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "PosCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_pEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [PosCustomBatchRequestEntry]))))

posCustomBatchRequest :: PosCustomBatchRequest Source #

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

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

pEntries :: Lens' PosCustomBatchRequest [PosCustomBatchRequestEntry] Source #

The request entries to be processed in the batch.

OrderinvoicesCreateChargeInvoiceRequest

data OrderinvoicesCreateChargeInvoiceRequest Source #

Instances
Eq OrderinvoicesCreateChargeInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderinvoicesCreateChargeInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderinvoicesCreateChargeInvoiceRequest -> Constr #

dataTypeOf :: OrderinvoicesCreateChargeInvoiceRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderinvoicesCreateChargeInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderinvoicesCreateChargeInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderinvoicesCreateChargeInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderinvoicesCreateChargeInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCreateChargeInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCreateChargeInvoiceRequest = D1 (MetaData "OrderinvoicesCreateChargeInvoiceRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderinvoicesCreateChargeInvoiceRequest'" PrefixI True) ((S1 (MetaSel (Just "_occirShipmentGroupId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_occirLineItemInvoices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ShipmentInvoiceLineItemInvoice]))) :*: (S1 (MetaSel (Just "_occirInvoiceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_occirInvoiceSummary") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InvoiceSummary)) :*: S1 (MetaSel (Just "_occirOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

orderinvoicesCreateChargeInvoiceRequest :: OrderinvoicesCreateChargeInvoiceRequest Source #

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

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

occirOperationId :: Lens' OrderinvoicesCreateChargeInvoiceRequest (Maybe Text) Source #

required
The ID of the operation, unique across all operations for a given order.

OrderLineItem

data OrderLineItem Source #

Instances
Eq OrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderLineItem -> Constr #

dataTypeOf :: OrderLineItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderLineItem :: Type -> Type #

ToJSON OrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItem = D1 (MetaData "OrderLineItem" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderLineItem'" PrefixI True) (((S1 (MetaSel (Just "_oliAnnotations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderMerchantProvidedAnnotation])) :*: (S1 (MetaSel (Just "_oliQuantityOrdered") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_oliReturnInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderLineItemReturnInfo)))) :*: ((S1 (MetaSel (Just "_oliQuantityDelivered") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_oliShippingDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderLineItemShippingDetails))) :*: (S1 (MetaSel (Just "_oliQuantityPending") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_oliCancellations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderCancellation]))))) :*: (((S1 (MetaSel (Just "_oliQuantityCanceled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_oliId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_oliTax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_oliPrice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)))) :*: ((S1 (MetaSel (Just "_oliQuantityShipped") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_oliQuantityReturned") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))) :*: (S1 (MetaSel (Just "_oliProduct") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderLineItemProduct)) :*: S1 (MetaSel (Just "_oliReturns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderReturn])))))))

oliAnnotations :: Lens' OrderLineItem [OrderMerchantProvidedAnnotation] Source #

Annotations that are attached to the line item.

oliReturnInfo :: Lens' OrderLineItem (Maybe OrderLineItemReturnInfo) Source #

Details of the return policy for the line item.

oliShippingDetails :: Lens' OrderLineItem (Maybe OrderLineItemShippingDetails) Source #

Details of the requested shipping for the line item.

oliCancellations :: Lens' OrderLineItem [OrderCancellation] Source #

Cancellations of the line item.

oliId :: Lens' OrderLineItem (Maybe Text) Source #

The id of the line item.

oliPrice :: Lens' OrderLineItem (Maybe Price) Source #

Total price for the line item. For example, if two items for $10 are purchased, the total price will be $20.

oliProduct :: Lens' OrderLineItem (Maybe OrderLineItemProduct) Source #

Product data as seen by customer from the time of the order placement. Note that certain attributes values (e.g. title or gtin) might be reformatted and no longer match values submitted via product feed.

oliReturns :: Lens' OrderLineItem [OrderReturn] Source #

Returns of the line item.

Service

data Service Source #

Instances
Eq Service Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

Data Service Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: Service -> Constr #

dataTypeOf :: Service -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Service Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Service Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Service :: Type -> Type #

Methods

from :: Service -> Rep Service x #

to :: Rep Service x -> Service #

ToJSON Service Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Service Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Service Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

service :: Service Source #

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

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

sDeliveryCountry :: Lens' Service (Maybe Text) Source #

The CLDR territory code of the country to which the service applies. Required.

sRateGroups :: Lens' Service [RateGroup] Source #

Shipping rate group definitions. Only the last one is allowed to have an empty applicableShippingLabels, which means "everything else". The other applicableShippingLabels must not overlap.

sDeliveryTime :: Lens' Service (Maybe DeliveryTime) Source #

Time spent in various aspects from order to the delivery of the product. Required.

sActive :: Lens' Service (Maybe Bool) Source #

A boolean exposing the active status of the shipping service. Required.

sName :: Lens' Service (Maybe Text) Source #

Free-form name of the service. Must be unique within target account. Required.

sCurrency :: Lens' Service (Maybe Text) Source #

The CLDR code of the currency to which this service applies. Must match that of the prices in rate groups.

sEligibility :: Lens' Service (Maybe Text) Source #

Eligibility for this service.

sMinimumOrderValue :: Lens' Service (Maybe Price) Source #

Minimum order value for this service. If set, indicates that customers will have to spend at least this amount. All prices within a service must have the same currency.

ProductstatusesCustomBatchResponse

data ProductstatusesCustomBatchResponse Source #

Instances
Eq ProductstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: ProductstatusesCustomBatchResponse -> Constr #

dataTypeOf :: ProductstatusesCustomBatchResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ProductstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductstatusesCustomBatchResponse :: Type -> Type #

ToJSON ProductstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesCustomBatchResponse = D1 (MetaData "ProductstatusesCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductstatusesCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_proEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ProductstatusesCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_proKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

productstatusesCustomBatchResponse :: ProductstatusesCustomBatchResponse Source #

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

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

proKind :: Lens' ProductstatusesCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#productstatusesCustomBatchResponse".

ProductUnitPricingMeasure

data ProductUnitPricingMeasure Source #

Instances
Eq ProductUnitPricingMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductUnitPricingMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: ProductUnitPricingMeasure -> Constr #

dataTypeOf :: ProductUnitPricingMeasure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ProductUnitPricingMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductUnitPricingMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductUnitPricingMeasure :: Type -> Type #

ToJSON ProductUnitPricingMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductUnitPricingMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductUnitPricingMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductUnitPricingMeasure = D1 (MetaData "ProductUnitPricingMeasure" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductUnitPricingMeasure'" PrefixI True) (S1 (MetaSel (Just "_pupmValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_pupmUnit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

productUnitPricingMeasure :: ProductUnitPricingMeasure Source #

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

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

OrdersUpdateShipmentRequest

data OrdersUpdateShipmentRequest Source #

Instances
Eq OrdersUpdateShipmentRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersUpdateShipmentRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrdersUpdateShipmentRequest -> Constr #

dataTypeOf :: OrdersUpdateShipmentRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrdersUpdateShipmentRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersUpdateShipmentRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersUpdateShipmentRequest :: Type -> Type #

ToJSON OrdersUpdateShipmentRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersUpdateShipmentRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateShipmentRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateShipmentRequest = D1 (MetaData "OrdersUpdateShipmentRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersUpdateShipmentRequest'" PrefixI True) ((S1 (MetaSel (Just "_ousrCarrier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ousrStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ousrTrackingId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_ousrShipmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ousrDeliveryDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ousrOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

ordersUpdateShipmentRequest :: OrdersUpdateShipmentRequest Source #

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

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

ousrCarrier :: Lens' OrdersUpdateShipmentRequest (Maybe Text) Source #

The carrier handling the shipment. Not updated if missing. See shipments[].carrier in the Orders resource representation for a list of acceptable values.

ousrStatus :: Lens' OrdersUpdateShipmentRequest (Maybe Text) Source #

New status for the shipment. Not updated if missing.

ousrTrackingId :: Lens' OrdersUpdateShipmentRequest (Maybe Text) Source #

The tracking id for the shipment. Not updated if missing.

ousrDeliveryDate :: Lens' OrdersUpdateShipmentRequest (Maybe Text) Source #

Date on which the shipment has been delivered, in ISO 8601 format. Optional and can be provided only if status is delivered.

ousrOperationId :: Lens' OrdersUpdateShipmentRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

OrderShipmentLineItemShipment

data OrderShipmentLineItemShipment Source #

Instances
Eq OrderShipmentLineItemShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderShipmentLineItemShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderShipmentLineItemShipment -> Constr #

dataTypeOf :: OrderShipmentLineItemShipment -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderShipmentLineItemShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderShipmentLineItemShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderShipmentLineItemShipment :: Type -> Type #

ToJSON OrderShipmentLineItemShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderShipmentLineItemShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderShipmentLineItemShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderShipmentLineItemShipment = D1 (MetaData "OrderShipmentLineItemShipment" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderShipmentLineItemShipment'" PrefixI True) (S1 (MetaSel (Just "_oslisQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: (S1 (MetaSel (Just "_oslisLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oslisProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

orderShipmentLineItemShipment :: OrderShipmentLineItemShipment Source #

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

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

oslisLineItemId :: Lens' OrderShipmentLineItemShipment (Maybe Text) Source #

The id of the line item that is shipped. Either lineItemId or productId is required.

oslisProductId :: Lens' OrderShipmentLineItemShipment (Maybe Text) Source #

The ID of the product to ship. This is the REST ID used in the products service. Either lineItemId or productId is required.

OrdersListStatuses

data OrdersListStatuses Source #

Obtains orders that match any of the specified statuses. Multiple values can be specified with comma separation. Additionally, please note that active is a shortcut for pendingShipment and partiallyShipped, and completed is a shortcut for shipped , partiallyDelivered, delivered, partiallyReturned, returned, and canceled.

Constructors

Active
active
Canceled
canceled
Completed
completed
Delivered
delivered
InProgress
inProgress
PartiallyDelivered
partiallyDelivered
PartiallyReturned
partiallyReturned
PartiallyShipped
partiallyShipped
PendingShipment
pendingShipment
Returned
returned
Shipped
shipped
Instances
Enum OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Eq OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Data OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Methods

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

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

toConstr :: OrdersListStatuses -> Constr #

dataTypeOf :: OrdersListStatuses -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Read OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Show OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Generic OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Associated Types

type Rep OrdersListStatuses :: Type -> Type #

Hashable OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

ToJSON OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

FromJSON OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

FromHttpApiData OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

ToHttpApiData OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

type Rep OrdersListStatuses Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

type Rep OrdersListStatuses = D1 (MetaData "OrdersListStatuses" "Network.Google.ShoppingContent.Types.Sum" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (((C1 (MetaCons "Active" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Canceled" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Completed" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Delivered" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "InProgress" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "PartiallyDelivered" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PartiallyReturned" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PartiallyShipped" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "PendingShipment" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Returned" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Shipped" PrefixI False) (U1 :: Type -> Type)))))

OrderreportsListTransactionsResponse

data OrderreportsListTransactionsResponse Source #

Instances
Eq OrderreportsListTransactionsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderreportsListTransactionsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: OrderreportsListTransactionsResponse -> Constr #

dataTypeOf :: OrderreportsListTransactionsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OrderreportsListTransactionsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderreportsListTransactionsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderreportsListTransactionsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderreportsListTransactionsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderreportsListTransactionsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderreportsListTransactionsResponse = D1 (MetaData "OrderreportsListTransactionsResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderreportsListTransactionsResponse'" PrefixI True) (S1 (MetaSel (Just "_oltrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oltrTransactions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderReportTransaction])) :*: S1 (MetaSel (Just "_oltrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

orderreportsListTransactionsResponse :: OrderreportsListTransactionsResponse Source #

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

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

oltrNextPageToken :: Lens' OrderreportsListTransactionsResponse (Maybe Text) Source #

The token for the retrieval of the next page of transactions.

oltrKind :: Lens' OrderreportsListTransactionsResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderreportsListTransactionsResponse".

LiaSettingsCustomBatchResponse

data LiaSettingsCustomBatchResponse Source #

Instances
Eq LiaSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: LiaSettingsCustomBatchResponse -> Constr #

dataTypeOf :: LiaSettingsCustomBatchResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LiaSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaSettingsCustomBatchResponse :: Type -> Type #

ToJSON LiaSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsCustomBatchResponse = D1 (MetaData "LiaSettingsCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaSettingsCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_lscbrEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [LiaSettingsCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_lscbrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

liaSettingsCustomBatchResponse :: LiaSettingsCustomBatchResponse Source #

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

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

lscbrEntries :: Lens' LiaSettingsCustomBatchResponse [LiaSettingsCustomBatchResponseEntry] Source #

The result of the execution of the batch requests.

lscbrKind :: Lens' LiaSettingsCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsCustomBatchResponse".

LoyaltyPoints

data LoyaltyPoints Source #

Instances
Eq LoyaltyPoints Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LoyaltyPoints Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: LoyaltyPoints -> Constr #

dataTypeOf :: LoyaltyPoints -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LoyaltyPoints Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LoyaltyPoints Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LoyaltyPoints :: Type -> Type #

ToJSON LoyaltyPoints Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LoyaltyPoints Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LoyaltyPoints Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LoyaltyPoints = D1 (MetaData "LoyaltyPoints" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LoyaltyPoints'" PrefixI True) (S1 (MetaSel (Just "_lpRatio") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: (S1 (MetaSel (Just "_lpPointsValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_lpName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

loyaltyPoints :: LoyaltyPoints Source #

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

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

lpRatio :: Lens' LoyaltyPoints (Maybe Double) Source #

The ratio of a point when converted to currency. Google assumes currency based on Merchant Center settings. If ratio is left out, it defaults to 1.0.

lpPointsValue :: Lens' LoyaltyPoints (Maybe Int64) Source #

The retailer's loyalty points in absolute value.

lpName :: Lens' LoyaltyPoints (Maybe Text) Source #

Name of loyalty points program. It is recommended to limit the name to 12 full-width characters or 24 Roman characters.

LiaSettingsSetPosDataProviderResponse

data LiaSettingsSetPosDataProviderResponse Source #

Instances
Eq LiaSettingsSetPosDataProviderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsSetPosDataProviderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: LiaSettingsSetPosDataProviderResponse -> Constr #

dataTypeOf :: LiaSettingsSetPosDataProviderResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LiaSettingsSetPosDataProviderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsSetPosDataProviderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON LiaSettingsSetPosDataProviderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsSetPosDataProviderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsSetPosDataProviderResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsSetPosDataProviderResponse = D1 (MetaData "LiaSettingsSetPosDataProviderResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "LiaSettingsSetPosDataProviderResponse'" PrefixI True) (S1 (MetaSel (Just "_lsspdprKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

liaSettingsSetPosDataProviderResponse :: LiaSettingsSetPosDataProviderResponse Source #

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

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

lsspdprKind :: Lens' LiaSettingsSetPosDataProviderResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsSetPosDataProviderResponse".

AccountStatus

data AccountStatus Source #

The status of an account, i.e., information about its products, which is computed offline and not returned immediately at insertion time.

See: accountStatus smart constructor.

Instances
Eq AccountStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountStatus -> Constr #

dataTypeOf :: AccountStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountStatus :: Type -> Type #

ToJSON AccountStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatus = D1 (MetaData "AccountStatus" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountStatus'" PrefixI True) ((S1 (MetaSel (Just "_asAccountLevelIssues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountStatusAccountLevelIssue])) :*: S1 (MetaSel (Just "_asKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) :*: (S1 (MetaSel (Just "_asAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_asProducts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountStatusProducts])) :*: S1 (MetaSel (Just "_asWebsiteClaimed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))))

accountStatus :: AccountStatus Source #

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

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

asKind :: Lens' AccountStatus Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountStatus".

asAccountId :: Lens' AccountStatus (Maybe Text) Source #

The ID of the account for which the status is reported.

asProducts :: Lens' AccountStatus [AccountStatusProducts] Source #

List of product-related data by channel, destination, and country. Data in this field may be delayed by up to 30 minutes.

asWebsiteClaimed :: Lens' AccountStatus (Maybe Bool) Source #

Whether the account's website is claimed or not.

ShippingSettingsCustomBatchRequestEntry

data ShippingSettingsCustomBatchRequestEntry Source #

A batch entry encoding a single non-batch shippingsettings request.

See: shippingSettingsCustomBatchRequestEntry smart constructor.

Instances
Eq ShippingSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShippingSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: ShippingSettingsCustomBatchRequestEntry -> Constr #

dataTypeOf :: ShippingSettingsCustomBatchRequestEntry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ShippingSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShippingSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON ShippingSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShippingSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsCustomBatchRequestEntry = D1 (MetaData "ShippingSettingsCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShippingSettingsCustomBatchRequestEntry'" PrefixI True) ((S1 (MetaSel (Just "_sscbreMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_sscbreAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))) :*: (S1 (MetaSel (Just "_sscbreMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_sscbreShippingSettings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ShippingSettings)) :*: S1 (MetaSel (Just "_sscbreBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

shippingSettingsCustomBatchRequestEntry :: ShippingSettingsCustomBatchRequestEntry Source #

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

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

sscbreAccountId :: Lens' ShippingSettingsCustomBatchRequestEntry (Maybe Word64) Source #

The ID of the account for which to get/update account shipping settings.

sscbreShippingSettings :: Lens' ShippingSettingsCustomBatchRequestEntry (Maybe ShippingSettings) Source #

The account shipping settings to update. Only defined if the method is update.

sscbreBatchId :: Lens' ShippingSettingsCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

PosInventoryResponse

data PosInventoryResponse Source #

Instances
Eq PosInventoryResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosInventoryResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: PosInventoryResponse -> Constr #

dataTypeOf :: PosInventoryResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PosInventoryResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosInventoryResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosInventoryResponse :: Type -> Type #

ToJSON PosInventoryResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosInventoryResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosInventoryResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

posInventoryResponse :: PosInventoryResponse Source #

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

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

pirStoreCode :: Lens' PosInventoryResponse (Maybe Text) Source #

The identifier of the merchant's store. Either a storeCode inserted via the API or the code of the store in Google My Business.

pirKind :: Lens' PosInventoryResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#posInventoryResponse".

pirItemId :: Lens' PosInventoryResponse (Maybe Text) Source #

A unique identifier for the item.

pirQuantity :: Lens' PosInventoryResponse (Maybe Int64) Source #

The available quantity of the item.

pirTargetCountry :: Lens' PosInventoryResponse (Maybe Text) Source #

The CLDR territory code for the item.

pirGtin :: Lens' PosInventoryResponse (Maybe Text) Source #

Global Trade Item Number.

pirPrice :: Lens' PosInventoryResponse (Maybe Price) Source #

The current price of the item.

pirContentLanguage :: Lens' PosInventoryResponse (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

pirTimestamp :: Lens' PosInventoryResponse (Maybe Text) Source #

The inventory timestamp, in ISO 8601 format.

AccountstatusesCustomBatchRequest

data AccountstatusesCustomBatchRequest Source #

Instances
Eq AccountstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccountstatusesCustomBatchRequest -> Constr #

dataTypeOf :: AccountstatusesCustomBatchRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccountstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountstatusesCustomBatchRequest :: Type -> Type #

ToJSON AccountstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesCustomBatchRequest = D1 (MetaData "AccountstatusesCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "AccountstatusesCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_acbrEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [AccountstatusesCustomBatchRequestEntry]))))

accountstatusesCustomBatchRequest :: AccountstatusesCustomBatchRequest Source #

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

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

AccounttaxListResponse

data AccounttaxListResponse Source #

Instances
Eq AccounttaxListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccounttaxListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

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

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

toConstr :: AccounttaxListResponse -> Constr #

dataTypeOf :: AccounttaxListResponse -> DataType #

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

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

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

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccounttaxListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccounttaxListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccounttaxListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccounttaxListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccounttaxListResponse -> m AccounttaxListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccounttaxListResponse -> m AccounttaxListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccounttaxListResponse -> m AccounttaxListResponse #

Show AccounttaxListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccounttaxListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccounttaxListResponse :: Type -> Type #

ToJSON AccounttaxListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccounttaxListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxListResponse = D1 (MetaData "AccounttaxListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccounttaxListResponse'" PrefixI True) (S1 (MetaSel (Just "_alrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_alrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_alrResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountTax])))))

accounttaxListResponse :: AccounttaxListResponse Source #

Creates a value of AccounttaxListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

alrNextPageToken :: Lens' AccounttaxListResponse (Maybe Text) Source #

The token for the retrieval of the next page of account tax settings.

alrKind :: Lens' AccounttaxListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accounttaxListResponse".

LiaSettingsRequestInventoryVerificationResponse

data LiaSettingsRequestInventoryVerificationResponse Source #

Instances
Eq LiaSettingsRequestInventoryVerificationResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsRequestInventoryVerificationResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettingsRequestInventoryVerificationResponse -> c LiaSettingsRequestInventoryVerificationResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettingsRequestInventoryVerificationResponse #

toConstr :: LiaSettingsRequestInventoryVerificationResponse -> Constr #

dataTypeOf :: LiaSettingsRequestInventoryVerificationResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettingsRequestInventoryVerificationResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettingsRequestInventoryVerificationResponse) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettingsRequestInventoryVerificationResponse -> LiaSettingsRequestInventoryVerificationResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsRequestInventoryVerificationResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsRequestInventoryVerificationResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettingsRequestInventoryVerificationResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettingsRequestInventoryVerificationResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettingsRequestInventoryVerificationResponse -> m LiaSettingsRequestInventoryVerificationResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsRequestInventoryVerificationResponse -> m LiaSettingsRequestInventoryVerificationResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsRequestInventoryVerificationResponse -> m LiaSettingsRequestInventoryVerificationResponse #

Show LiaSettingsRequestInventoryVerificationResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsRequestInventoryVerificationResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON LiaSettingsRequestInventoryVerificationResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsRequestInventoryVerificationResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsRequestInventoryVerificationResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsRequestInventoryVerificationResponse = D1 (MetaData "LiaSettingsRequestInventoryVerificationResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "LiaSettingsRequestInventoryVerificationResponse'" PrefixI True) (S1 (MetaSel (Just "_lsrivrKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

liaSettingsRequestInventoryVerificationResponse :: LiaSettingsRequestInventoryVerificationResponse Source #

Creates a value of LiaSettingsRequestInventoryVerificationResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lsrivrKind :: Lens' LiaSettingsRequestInventoryVerificationResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsRequestInventoryVerificationResponse".

OrderinvoicesCreateChargeInvoiceResponse

data OrderinvoicesCreateChargeInvoiceResponse Source #

Instances
Eq OrderinvoicesCreateChargeInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderinvoicesCreateChargeInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderinvoicesCreateChargeInvoiceResponse -> c OrderinvoicesCreateChargeInvoiceResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderinvoicesCreateChargeInvoiceResponse #

toConstr :: OrderinvoicesCreateChargeInvoiceResponse -> Constr #

dataTypeOf :: OrderinvoicesCreateChargeInvoiceResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderinvoicesCreateChargeInvoiceResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderinvoicesCreateChargeInvoiceResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrderinvoicesCreateChargeInvoiceResponse -> OrderinvoicesCreateChargeInvoiceResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderinvoicesCreateChargeInvoiceResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderinvoicesCreateChargeInvoiceResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderinvoicesCreateChargeInvoiceResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderinvoicesCreateChargeInvoiceResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderinvoicesCreateChargeInvoiceResponse -> m OrderinvoicesCreateChargeInvoiceResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderinvoicesCreateChargeInvoiceResponse -> m OrderinvoicesCreateChargeInvoiceResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderinvoicesCreateChargeInvoiceResponse -> m OrderinvoicesCreateChargeInvoiceResponse #

Show OrderinvoicesCreateChargeInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderinvoicesCreateChargeInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderinvoicesCreateChargeInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderinvoicesCreateChargeInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCreateChargeInvoiceResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCreateChargeInvoiceResponse = D1 (MetaData "OrderinvoicesCreateChargeInvoiceResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderinvoicesCreateChargeInvoiceResponse'" PrefixI True) (S1 (MetaSel (Just "_occirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_occirExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderinvoicesCreateChargeInvoiceResponse :: OrderinvoicesCreateChargeInvoiceResponse Source #

Creates a value of OrderinvoicesCreateChargeInvoiceResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

occirKind :: Lens' OrderinvoicesCreateChargeInvoiceResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderinvoicesCreateChargeInvoiceResponse".

DatafeedsFetchNowResponse

data DatafeedsFetchNowResponse Source #

Instances
Eq DatafeedsFetchNowResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedsFetchNowResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedsFetchNowResponse -> c DatafeedsFetchNowResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedsFetchNowResponse #

toConstr :: DatafeedsFetchNowResponse -> Constr #

dataTypeOf :: DatafeedsFetchNowResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedsFetchNowResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedsFetchNowResponse) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedsFetchNowResponse -> DatafeedsFetchNowResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsFetchNowResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsFetchNowResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedsFetchNowResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedsFetchNowResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedsFetchNowResponse -> m DatafeedsFetchNowResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsFetchNowResponse -> m DatafeedsFetchNowResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsFetchNowResponse -> m DatafeedsFetchNowResponse #

Show DatafeedsFetchNowResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedsFetchNowResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedsFetchNowResponse :: Type -> Type #

ToJSON DatafeedsFetchNowResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedsFetchNowResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsFetchNowResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsFetchNowResponse = D1 (MetaData "DatafeedsFetchNowResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "DatafeedsFetchNowResponse'" PrefixI True) (S1 (MetaSel (Just "_dfnrKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

datafeedsFetchNowResponse :: DatafeedsFetchNowResponse Source #

Creates a value of DatafeedsFetchNowResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dfnrKind :: Lens' DatafeedsFetchNowResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#datafeedsFetchNowResponse".

OrdersGetTestOrderTemplateResponse

data OrdersGetTestOrderTemplateResponse Source #

Instances
Eq OrdersGetTestOrderTemplateResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersGetTestOrderTemplateResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersGetTestOrderTemplateResponse -> c OrdersGetTestOrderTemplateResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersGetTestOrderTemplateResponse #

toConstr :: OrdersGetTestOrderTemplateResponse -> Constr #

dataTypeOf :: OrdersGetTestOrderTemplateResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersGetTestOrderTemplateResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersGetTestOrderTemplateResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersGetTestOrderTemplateResponse -> OrdersGetTestOrderTemplateResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersGetTestOrderTemplateResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersGetTestOrderTemplateResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersGetTestOrderTemplateResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersGetTestOrderTemplateResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersGetTestOrderTemplateResponse -> m OrdersGetTestOrderTemplateResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersGetTestOrderTemplateResponse -> m OrdersGetTestOrderTemplateResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersGetTestOrderTemplateResponse -> m OrdersGetTestOrderTemplateResponse #

Show OrdersGetTestOrderTemplateResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersGetTestOrderTemplateResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersGetTestOrderTemplateResponse :: Type -> Type #

ToJSON OrdersGetTestOrderTemplateResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersGetTestOrderTemplateResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersGetTestOrderTemplateResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersGetTestOrderTemplateResponse = D1 (MetaData "OrdersGetTestOrderTemplateResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersGetTestOrderTemplateResponse'" PrefixI True) (S1 (MetaSel (Just "_ogtotrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ogtotrTemplate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TestOrder))))

ordersGetTestOrderTemplateResponse :: OrdersGetTestOrderTemplateResponse Source #

Creates a value of OrdersGetTestOrderTemplateResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ogtotrKind :: Lens' OrdersGetTestOrderTemplateResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersGetTestOrderTemplateResponse".

AccountsCustomBatchRequestEntry

data AccountsCustomBatchRequestEntry Source #

A batch entry encoding a single non-batch accounts request.

See: accountsCustomBatchRequestEntry smart constructor.

Instances
Eq AccountsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountsCustomBatchRequestEntry -> c AccountsCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountsCustomBatchRequestEntry #

toConstr :: AccountsCustomBatchRequestEntry -> Constr #

dataTypeOf :: AccountsCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountsCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountsCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> AccountsCustomBatchRequestEntry -> AccountsCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountsCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountsCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountsCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountsCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequestEntry -> m AccountsCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequestEntry -> m AccountsCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequestEntry -> m AccountsCustomBatchRequestEntry #

Show AccountsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsCustomBatchRequestEntry :: Type -> Type #

ToJSON AccountsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

accountsCustomBatchRequestEntry :: AccountsCustomBatchRequestEntry Source #

Creates a value of AccountsCustomBatchRequestEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

accForce :: Lens' AccountsCustomBatchRequestEntry (Maybe Bool) Source #

Whether the account should be deleted if the account has offers. Only applicable if the method is delete.

accAccount :: Lens' AccountsCustomBatchRequestEntry (Maybe Account) Source #

The account to create or update. Only defined if the method is insert or update.

accAccountId :: Lens' AccountsCustomBatchRequestEntry (Maybe Word64) Source #

The ID of the targeted account. Only defined if the method is not insert.

accMethod :: Lens' AccountsCustomBatchRequestEntry (Maybe Text) Source #

The method of the batch entry.

accOverwrite :: Lens' AccountsCustomBatchRequestEntry (Maybe Bool) Source #

Only applicable if the method is claimwebsite. Indicates whether or not to take the claim from another account in case there is a conflict.

accBatchId :: Lens' AccountsCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

Weight

data Weight Source #

Instances
Eq Weight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Weight -> Weight -> Bool #

(/=) :: Weight -> Weight -> Bool #

Data Weight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Weight -> c Weight #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Weight #

toConstr :: Weight -> Constr #

dataTypeOf :: Weight -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Weight) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Weight) #

gmapT :: (forall b. Data b => b -> b) -> Weight -> Weight #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Weight -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Weight -> r #

gmapQ :: (forall d. Data d => d -> u) -> Weight -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Weight -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Weight -> m Weight #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Weight -> m Weight #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Weight -> m Weight #

Show Weight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Weight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Weight :: Type -> Type #

Methods

from :: Weight -> Rep Weight x #

to :: Rep Weight x -> Weight #

ToJSON Weight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Weight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Weight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Weight = D1 (MetaData "Weight" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Weight'" PrefixI True) (S1 (MetaSel (Just "_wValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_wUnit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

weight :: Weight Source #

Creates a value of Weight with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wValue :: Lens' Weight (Maybe Text) Source #

The weight represented as a number.

wUnit :: Lens' Weight (Maybe Text) Source #

The weight unit.

OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption

data OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption Source #

Instances
Eq OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> c OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption #

toConstr :: OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> Constr #

dataTypeOf :: OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption) #

gmapT :: (forall b. Data b => b -> b) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> m OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> m OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption -> m OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption #

Show OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption = D1 (MetaData "OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption'" PrefixI True) (S1 (MetaSel (Just "_ocbrecriroReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ocbrecriroDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

LiaSettingsListResponse

data LiaSettingsListResponse Source #

Instances
Eq LiaSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettingsListResponse -> c LiaSettingsListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettingsListResponse #

toConstr :: LiaSettingsListResponse -> Constr #

dataTypeOf :: LiaSettingsListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettingsListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettingsListResponse) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettingsListResponse -> LiaSettingsListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettingsListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettingsListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettingsListResponse -> m LiaSettingsListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsListResponse -> m LiaSettingsListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsListResponse -> m LiaSettingsListResponse #

Show LiaSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaSettingsListResponse :: Type -> Type #

ToJSON LiaSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsListResponse = D1 (MetaData "LiaSettingsListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaSettingsListResponse'" PrefixI True) (S1 (MetaSel (Just "_lslrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_lslrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_lslrResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [LiaSettings])))))

liaSettingsListResponse :: LiaSettingsListResponse Source #

Creates a value of LiaSettingsListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lslrNextPageToken :: Lens' LiaSettingsListResponse (Maybe Text) Source #

The token for the retrieval of the next page of LIA settings.

lslrKind :: Lens' LiaSettingsListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsListResponse".

Error'

data Error' Source #

An error returned by the API.

See: error' smart constructor.

Instances
Eq Error' Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Error' -> Error' -> Bool #

(/=) :: Error' -> Error' -> Bool #

Data Error' Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Error' -> c Error' #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Error' #

toConstr :: Error' -> Constr #

dataTypeOf :: Error' -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Error') #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Error') #

gmapT :: (forall b. Data b => b -> b) -> Error' -> Error' #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Error' -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Error' -> r #

gmapQ :: (forall d. Data d => d -> u) -> Error' -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Error' -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Error' -> m Error' #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Error' -> m Error' #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Error' -> m Error' #

Show Error' Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Error' Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Error' :: Type -> Type #

Methods

from :: Error' -> Rep Error' x #

to :: Rep Error' x -> Error' #

ToJSON Error' Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Error' Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Error' Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Error' = D1 (MetaData "Error'" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Error''" PrefixI True) (S1 (MetaSel (Just "_eDomain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_eReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

error' :: Error' Source #

Creates a value of Error with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

eDomain :: Lens' Error' (Maybe Text) Source #

The domain of the error.

eReason :: Lens' Error' (Maybe Text) Source #

The error code.

eMessage :: Lens' Error' (Maybe Text) Source #

A description of the error.

ProductstatusesListResponse

data ProductstatusesListResponse Source #

Instances
Eq ProductstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductstatusesListResponse -> c ProductstatusesListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductstatusesListResponse #

toConstr :: ProductstatusesListResponse -> Constr #

dataTypeOf :: ProductstatusesListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductstatusesListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductstatusesListResponse) #

gmapT :: (forall b. Data b => b -> b) -> ProductstatusesListResponse -> ProductstatusesListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductstatusesListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductstatusesListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductstatusesListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductstatusesListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductstatusesListResponse -> m ProductstatusesListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductstatusesListResponse -> m ProductstatusesListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductstatusesListResponse -> m ProductstatusesListResponse #

Show ProductstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductstatusesListResponse :: Type -> Type #

ToJSON ProductstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesListResponse = D1 (MetaData "ProductstatusesListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductstatusesListResponse'" PrefixI True) (S1 (MetaSel (Just "_plrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_plrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_plrResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ProductStatus])))))

productstatusesListResponse :: ProductstatusesListResponse Source #

Creates a value of ProductstatusesListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

plrNextPageToken :: Lens' ProductstatusesListResponse (Maybe Text) Source #

The token for the retrieval of the next page of products statuses.

plrKind :: Lens' ProductstatusesListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#productstatusesListResponse".

OrderPromotionItem

data OrderPromotionItem Source #

Instances
Eq OrderPromotionItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderPromotionItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderPromotionItem -> c OrderPromotionItem #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderPromotionItem #

toConstr :: OrderPromotionItem -> Constr #

dataTypeOf :: OrderPromotionItem -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderPromotionItem) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderPromotionItem) #

gmapT :: (forall b. Data b => b -> b) -> OrderPromotionItem -> OrderPromotionItem #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderPromotionItem -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderPromotionItem -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderPromotionItem -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderPromotionItem -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderPromotionItem -> m OrderPromotionItem #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderPromotionItem -> m OrderPromotionItem #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderPromotionItem -> m OrderPromotionItem #

Show OrderPromotionItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderPromotionItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderPromotionItem :: Type -> Type #

ToJSON OrderPromotionItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderPromotionItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderPromotionItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderPromotionItem = D1 (MetaData "OrderPromotionItem" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderPromotionItem'" PrefixI True) (S1 (MetaSel (Just "_opiQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_opiLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_opiProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

orderPromotionItem :: OrderPromotionItem Source #

Creates a value of OrderPromotionItem with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

opiQuantity :: Lens' OrderPromotionItem (Maybe Int32) Source #

The quantity of the associated product.

PosCustomBatchResponse

data PosCustomBatchResponse Source #

Instances
Eq PosCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosCustomBatchResponse -> c PosCustomBatchResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosCustomBatchResponse #

toConstr :: PosCustomBatchResponse -> Constr #

dataTypeOf :: PosCustomBatchResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosCustomBatchResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosCustomBatchResponse) #

gmapT :: (forall b. Data b => b -> b) -> PosCustomBatchResponse -> PosCustomBatchResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosCustomBatchResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosCustomBatchResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosCustomBatchResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosCustomBatchResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosCustomBatchResponse -> m PosCustomBatchResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosCustomBatchResponse -> m PosCustomBatchResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosCustomBatchResponse -> m PosCustomBatchResponse #

Show PosCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosCustomBatchResponse :: Type -> Type #

ToJSON PosCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosCustomBatchResponse = D1 (MetaData "PosCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_posEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PosCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_posKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

posCustomBatchResponse :: PosCustomBatchResponse Source #

Creates a value of PosCustomBatchResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

posEntries :: Lens' PosCustomBatchResponse [PosCustomBatchResponseEntry] Source #

The result of the execution of the batch requests.

posKind :: Lens' PosCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#posCustomBatchResponse".

OrdersCreateTestOrderRequest

data OrdersCreateTestOrderRequest Source #

Instances
Eq OrdersCreateTestOrderRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCreateTestOrderRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCreateTestOrderRequest -> c OrdersCreateTestOrderRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCreateTestOrderRequest #

toConstr :: OrdersCreateTestOrderRequest -> Constr #

dataTypeOf :: OrdersCreateTestOrderRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCreateTestOrderRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCreateTestOrderRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCreateTestOrderRequest -> OrdersCreateTestOrderRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCreateTestOrderRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCreateTestOrderRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCreateTestOrderRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCreateTestOrderRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCreateTestOrderRequest -> m OrdersCreateTestOrderRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCreateTestOrderRequest -> m OrdersCreateTestOrderRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCreateTestOrderRequest -> m OrdersCreateTestOrderRequest #

Show OrdersCreateTestOrderRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCreateTestOrderRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersCreateTestOrderRequest :: Type -> Type #

ToJSON OrdersCreateTestOrderRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCreateTestOrderRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCreateTestOrderRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCreateTestOrderRequest = D1 (MetaData "OrdersCreateTestOrderRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCreateTestOrderRequest'" PrefixI True) (S1 (MetaSel (Just "_octorTemplateName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_octorCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_octorTestOrder") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TestOrder)))))

ordersCreateTestOrderRequest :: OrdersCreateTestOrderRequest Source #

Creates a value of OrdersCreateTestOrderRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

octorTemplateName :: Lens' OrdersCreateTestOrderRequest (Maybe Text) Source #

The test order template to use. Specify as an alternative to testOrder as a shortcut for retrieving a template and then creating an order using that template.

octorCountry :: Lens' OrdersCreateTestOrderRequest (Maybe Text) Source #

The CLDR territory code of the country of the test order to create. Affects the currency and addresses of orders created via template_name, or the addresses of orders created via test_order. Acceptable values are: - "US" - "FR" Defaults to US.

AccountUser

data AccountUser Source #

Instances
Eq AccountUser Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountUser Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountUser -> c AccountUser #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountUser #

toConstr :: AccountUser -> Constr #

dataTypeOf :: AccountUser -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountUser) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountUser) #

gmapT :: (forall b. Data b => b -> b) -> AccountUser -> AccountUser #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountUser -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountUser -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountUser -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountUser -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountUser -> m AccountUser #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountUser -> m AccountUser #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountUser -> m AccountUser #

Show AccountUser Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountUser Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountUser :: Type -> Type #

ToJSON AccountUser Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountUser Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountUser Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountUser = D1 (MetaData "AccountUser" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountUser'" PrefixI True) (S1 (MetaSel (Just "_auAdmin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_auEmailAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

accountUser :: AccountUser Source #

Creates a value of AccountUser with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

auAdmin :: Lens' AccountUser (Maybe Bool) Source #

Whether user is an admin.

auEmailAddress :: Lens' AccountUser (Maybe Text) Source #

User's email address.

AccountCustomerService

data AccountCustomerService Source #

Instances
Eq AccountCustomerService Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountCustomerService Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountCustomerService -> c AccountCustomerService #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountCustomerService #

toConstr :: AccountCustomerService -> Constr #

dataTypeOf :: AccountCustomerService -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountCustomerService) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountCustomerService) #

gmapT :: (forall b. Data b => b -> b) -> AccountCustomerService -> AccountCustomerService #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountCustomerService -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountCustomerService -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountCustomerService -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountCustomerService -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountCustomerService -> m AccountCustomerService #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountCustomerService -> m AccountCustomerService #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountCustomerService -> m AccountCustomerService #

Show AccountCustomerService Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountCustomerService Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountCustomerService :: Type -> Type #

ToJSON AccountCustomerService Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountCustomerService Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountCustomerService Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountCustomerService = D1 (MetaData "AccountCustomerService" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountCustomerService'" PrefixI True) (S1 (MetaSel (Just "_acsEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_acsURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acsPhoneNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

accountCustomerService :: AccountCustomerService Source #

Creates a value of AccountCustomerService with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acsEmail :: Lens' AccountCustomerService (Maybe Text) Source #

Customer service email.

acsPhoneNumber :: Lens' AccountCustomerService (Maybe Text) Source #

Customer service phone number.

OrderreturnsListOrderBy

data OrderreturnsListOrderBy Source #

Return the results in the specified order.

Constructors

ReturnCreationTimeAsc
returnCreationTimeAsc
ReturnCreationTimeDesc
returnCreationTimeDesc
Instances
Enum OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Eq OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Data OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderreturnsListOrderBy -> c OrderreturnsListOrderBy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderreturnsListOrderBy #

toConstr :: OrderreturnsListOrderBy -> Constr #

dataTypeOf :: OrderreturnsListOrderBy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderreturnsListOrderBy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderreturnsListOrderBy) #

gmapT :: (forall b. Data b => b -> b) -> OrderreturnsListOrderBy -> OrderreturnsListOrderBy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderreturnsListOrderBy -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderreturnsListOrderBy -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderreturnsListOrderBy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderreturnsListOrderBy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderreturnsListOrderBy -> m OrderreturnsListOrderBy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderreturnsListOrderBy -> m OrderreturnsListOrderBy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderreturnsListOrderBy -> m OrderreturnsListOrderBy #

Ord OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Read OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Show OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Generic OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

Associated Types

type Rep OrderreturnsListOrderBy :: Type -> Type #

Hashable OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

ToJSON OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

FromJSON OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

FromHttpApiData OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

ToHttpApiData OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

type Rep OrderreturnsListOrderBy Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Sum

type Rep OrderreturnsListOrderBy = D1 (MetaData "OrderreturnsListOrderBy" "Network.Google.ShoppingContent.Types.Sum" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ReturnCreationTimeAsc" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ReturnCreationTimeDesc" PrefixI False) (U1 :: Type -> Type))

GmbAccountsGmbAccount

data GmbAccountsGmbAccount Source #

Instances
Eq GmbAccountsGmbAccount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data GmbAccountsGmbAccount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GmbAccountsGmbAccount -> c GmbAccountsGmbAccount #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GmbAccountsGmbAccount #

toConstr :: GmbAccountsGmbAccount -> Constr #

dataTypeOf :: GmbAccountsGmbAccount -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GmbAccountsGmbAccount) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GmbAccountsGmbAccount) #

gmapT :: (forall b. Data b => b -> b) -> GmbAccountsGmbAccount -> GmbAccountsGmbAccount #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GmbAccountsGmbAccount -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GmbAccountsGmbAccount -> r #

gmapQ :: (forall d. Data d => d -> u) -> GmbAccountsGmbAccount -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GmbAccountsGmbAccount -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GmbAccountsGmbAccount -> m GmbAccountsGmbAccount #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GmbAccountsGmbAccount -> m GmbAccountsGmbAccount #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GmbAccountsGmbAccount -> m GmbAccountsGmbAccount #

Show GmbAccountsGmbAccount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic GmbAccountsGmbAccount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep GmbAccountsGmbAccount :: Type -> Type #

ToJSON GmbAccountsGmbAccount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON GmbAccountsGmbAccount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep GmbAccountsGmbAccount Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep GmbAccountsGmbAccount = D1 (MetaData "GmbAccountsGmbAccount" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "GmbAccountsGmbAccount'" PrefixI True) ((S1 (MetaSel (Just "_gagaEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gagaListingCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))) :*: (S1 (MetaSel (Just "_gagaName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gagaType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

gmbAccountsGmbAccount :: GmbAccountsGmbAccount Source #

Creates a value of GmbAccountsGmbAccount with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gagaEmail :: Lens' GmbAccountsGmbAccount (Maybe Text) Source #

The email which identifies the GMB account.

gagaListingCount :: Lens' GmbAccountsGmbAccount (Maybe Word64) Source #

Number of listings under this account.

gagaName :: Lens' GmbAccountsGmbAccount (Maybe Text) Source #

The name of the GMB account.

gagaType :: Lens' GmbAccountsGmbAccount (Maybe Text) Source #

The type of the GMB account (User or Business).

OrdersInStoreRefundLineItemResponse

data OrdersInStoreRefundLineItemResponse Source #

Instances
Eq OrdersInStoreRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersInStoreRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersInStoreRefundLineItemResponse -> c OrdersInStoreRefundLineItemResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersInStoreRefundLineItemResponse #

toConstr :: OrdersInStoreRefundLineItemResponse -> Constr #

dataTypeOf :: OrdersInStoreRefundLineItemResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersInStoreRefundLineItemResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersInStoreRefundLineItemResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersInStoreRefundLineItemResponse -> OrdersInStoreRefundLineItemResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersInStoreRefundLineItemResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersInStoreRefundLineItemResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersInStoreRefundLineItemResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersInStoreRefundLineItemResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersInStoreRefundLineItemResponse -> m OrdersInStoreRefundLineItemResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersInStoreRefundLineItemResponse -> m OrdersInStoreRefundLineItemResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersInStoreRefundLineItemResponse -> m OrdersInStoreRefundLineItemResponse #

Show OrdersInStoreRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersInStoreRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrdersInStoreRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersInStoreRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersInStoreRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersInStoreRefundLineItemResponse = D1 (MetaData "OrdersInStoreRefundLineItemResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersInStoreRefundLineItemResponse'" PrefixI True) (S1 (MetaSel (Just "_oisrlirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oisrlirExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersInStoreRefundLineItemResponse :: OrdersInStoreRefundLineItemResponse Source #

Creates a value of OrdersInStoreRefundLineItemResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oisrlirKind :: Lens' OrdersInStoreRefundLineItemResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersInStoreRefundLineItemResponse".

DatafeedsCustomBatchRequestEntry

data DatafeedsCustomBatchRequestEntry Source #

A batch entry encoding a single non-batch datafeeds request.

See: datafeedsCustomBatchRequestEntry smart constructor.

Instances
Eq DatafeedsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedsCustomBatchRequestEntry -> c DatafeedsCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedsCustomBatchRequestEntry #

toConstr :: DatafeedsCustomBatchRequestEntry -> Constr #

dataTypeOf :: DatafeedsCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedsCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedsCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedsCustomBatchRequestEntry -> DatafeedsCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedsCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedsCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchRequestEntry -> m DatafeedsCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchRequestEntry -> m DatafeedsCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchRequestEntry -> m DatafeedsCustomBatchRequestEntry #

Show DatafeedsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedsCustomBatchRequestEntry :: Type -> Type #

ToJSON DatafeedsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsCustomBatchRequestEntry = D1 (MetaData "DatafeedsCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedsCustomBatchRequestEntry'" PrefixI True) ((S1 (MetaSel (Just "_dcbreMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_dcbreDatafeed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Datafeed))) :*: (S1 (MetaSel (Just "_dcbreMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dcbreDatafeedId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_dcbreBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

datafeedsCustomBatchRequestEntry :: DatafeedsCustomBatchRequestEntry Source #

Creates a value of DatafeedsCustomBatchRequestEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dcbreDatafeedId :: Lens' DatafeedsCustomBatchRequestEntry (Maybe Word64) Source #

The ID of the data feed to get, delete or fetch.

dcbreBatchId :: Lens' DatafeedsCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

OrderCustomerMarketingRightsInfo

data OrderCustomerMarketingRightsInfo Source #

Instances
Eq OrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderCustomerMarketingRightsInfo -> c OrderCustomerMarketingRightsInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderCustomerMarketingRightsInfo #

toConstr :: OrderCustomerMarketingRightsInfo -> Constr #

dataTypeOf :: OrderCustomerMarketingRightsInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderCustomerMarketingRightsInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderCustomerMarketingRightsInfo) #

gmapT :: (forall b. Data b => b -> b) -> OrderCustomerMarketingRightsInfo -> OrderCustomerMarketingRightsInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderCustomerMarketingRightsInfo -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderCustomerMarketingRightsInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderCustomerMarketingRightsInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderCustomerMarketingRightsInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderCustomerMarketingRightsInfo -> m OrderCustomerMarketingRightsInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderCustomerMarketingRightsInfo -> m OrderCustomerMarketingRightsInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderCustomerMarketingRightsInfo -> m OrderCustomerMarketingRightsInfo #

Show OrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderCustomerMarketingRightsInfo :: Type -> Type #

ToJSON OrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderCustomerMarketingRightsInfo = D1 (MetaData "OrderCustomerMarketingRightsInfo" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderCustomerMarketingRightsInfo'" PrefixI True) (S1 (MetaSel (Just "_ocmriExplicitMarketingPreference") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ocmriMarketingEmailAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ocmriLastUpdatedTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

orderCustomerMarketingRightsInfo :: OrderCustomerMarketingRightsInfo Source #

Creates a value of OrderCustomerMarketingRightsInfo with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ocmriExplicitMarketingPreference :: Lens' OrderCustomerMarketingRightsInfo (Maybe Text) Source #

Last known user selection regarding marketing preferences. In certain cases this selection might not be known, so this field would be empty.

ocmriMarketingEmailAddress :: Lens' OrderCustomerMarketingRightsInfo (Maybe Text) Source #

Email address that can be used for marketing purposes. This field is only filled when explicitMarketingPreference is equal to 'granted'.

ocmriLastUpdatedTimestamp :: Lens' OrderCustomerMarketingRightsInfo (Maybe Text) Source #

Timestamp when last time marketing preference was updated. Could be empty, if user wasn't offered a selection yet.

MerchantOrderReturnItem

data MerchantOrderReturnItem Source #

Instances
Eq MerchantOrderReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data MerchantOrderReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MerchantOrderReturnItem -> c MerchantOrderReturnItem #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MerchantOrderReturnItem #

toConstr :: MerchantOrderReturnItem -> Constr #

dataTypeOf :: MerchantOrderReturnItem -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MerchantOrderReturnItem) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MerchantOrderReturnItem) #

gmapT :: (forall b. Data b => b -> b) -> MerchantOrderReturnItem -> MerchantOrderReturnItem #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MerchantOrderReturnItem -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MerchantOrderReturnItem -> r #

gmapQ :: (forall d. Data d => d -> u) -> MerchantOrderReturnItem -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MerchantOrderReturnItem -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MerchantOrderReturnItem -> m MerchantOrderReturnItem #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MerchantOrderReturnItem -> m MerchantOrderReturnItem #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MerchantOrderReturnItem -> m MerchantOrderReturnItem #

Show MerchantOrderReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic MerchantOrderReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep MerchantOrderReturnItem :: Type -> Type #

ToJSON MerchantOrderReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON MerchantOrderReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep MerchantOrderReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep MerchantOrderReturnItem = D1 (MetaData "MerchantOrderReturnItem" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "MerchantOrderReturnItem'" PrefixI True) ((S1 (MetaSel (Just "_moriReturnShipmentIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_moriMerchantReturnReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RefundReason)) :*: S1 (MetaSel (Just "_moriState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_moriCustomerReturnReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CustomerReturnReason)) :*: (S1 (MetaSel (Just "_moriItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_moriProduct") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderLineItemProduct))))))

merchantOrderReturnItem :: MerchantOrderReturnItem Source #

Creates a value of MerchantOrderReturnItem with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

AccountStatusAccountLevelIssue

data AccountStatusAccountLevelIssue Source #

Instances
Eq AccountStatusAccountLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountStatusAccountLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountStatusAccountLevelIssue -> c AccountStatusAccountLevelIssue #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountStatusAccountLevelIssue #

toConstr :: AccountStatusAccountLevelIssue -> Constr #

dataTypeOf :: AccountStatusAccountLevelIssue -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountStatusAccountLevelIssue) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountStatusAccountLevelIssue) #

gmapT :: (forall b. Data b => b -> b) -> AccountStatusAccountLevelIssue -> AccountStatusAccountLevelIssue #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountStatusAccountLevelIssue -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountStatusAccountLevelIssue -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountStatusAccountLevelIssue -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountStatusAccountLevelIssue -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountStatusAccountLevelIssue -> m AccountStatusAccountLevelIssue #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountStatusAccountLevelIssue -> m AccountStatusAccountLevelIssue #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountStatusAccountLevelIssue -> m AccountStatusAccountLevelIssue #

Show AccountStatusAccountLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountStatusAccountLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountStatusAccountLevelIssue :: Type -> Type #

ToJSON AccountStatusAccountLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountStatusAccountLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatusAccountLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatusAccountLevelIssue = D1 (MetaData "AccountStatusAccountLevelIssue" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountStatusAccountLevelIssue'" PrefixI True) ((S1 (MetaSel (Just "_asaliDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_asaliCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asaliSeverity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_asaliDocumentation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asaliId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_asaliTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asaliDetail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

accountStatusAccountLevelIssue :: AccountStatusAccountLevelIssue Source #

Creates a value of AccountStatusAccountLevelIssue with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

asaliDestination :: Lens' AccountStatusAccountLevelIssue (Maybe Text) Source #

The destination the issue applies to.

asaliCountry :: Lens' AccountStatusAccountLevelIssue (Maybe Text) Source #

Country for which this issue is reported.

asaliDocumentation :: Lens' AccountStatusAccountLevelIssue (Maybe Text) Source #

The URL of a web page to help resolving this issue.

asaliTitle :: Lens' AccountStatusAccountLevelIssue (Maybe Text) Source #

Short description of the issue.

asaliDetail :: Lens' AccountStatusAccountLevelIssue (Maybe Text) Source #

Additional details about the issue.

Value

data Value Source #

The single value of a rate group or the value of a rate group table's cell. Exactly one of noShipping, flatRate, pricePercentage, carrierRateName, subtableName must be set.

See: value smart constructor.

Instances
Eq Value Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Data Value Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Value -> c Value #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Value #

toConstr :: Value -> Constr #

dataTypeOf :: Value -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Value) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Value) #

gmapT :: (forall b. Data b => b -> b) -> Value -> Value #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r #

gmapQ :: (forall d. Data d => d -> u) -> Value -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Value -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Value -> m Value #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value #

Show Value Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Generic Value Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Value :: Type -> Type #

Methods

from :: Value -> Rep Value x #

to :: Rep Value x -> Value #

ToJSON Value Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Value Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Value Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Value = D1 (MetaData "Value" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Value'" PrefixI True) ((S1 (MetaSel (Just "_vPricePercentage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_vCarrierRateName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_vFlatRate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: (S1 (MetaSel (Just "_vSubtableName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_vNoShipping") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))))

value :: Value Source #

Creates a value of Value with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

vPricePercentage :: Lens' Value (Maybe Text) Source #

A percentage of the price represented as a number in decimal notation (e.g., "5.4"). Can only be set if all other fields are not set.

vCarrierRateName :: Lens' Value (Maybe Text) Source #

The name of a carrier rate referring to a carrier rate defined in the same rate group. Can only be set if all other fields are not set.

vFlatRate :: Lens' Value (Maybe Price) Source #

A flat rate. Can only be set if all other fields are not set.

vSubtableName :: Lens' Value (Maybe Text) Source #

The name of a subtable. Can only be set in table cells (i.e., not for single values), and only if all other fields are not set.

vNoShipping :: Lens' Value (Maybe Bool) Source #

If true, then the product can't ship. Must be true when set, can only be set if all other fields are not set.

Installment

data Installment Source #

Instances
Eq Installment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data Installment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Installment -> c Installment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Installment #

toConstr :: Installment -> Constr #

dataTypeOf :: Installment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Installment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Installment) #

gmapT :: (forall b. Data b => b -> b) -> Installment -> Installment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Installment -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Installment -> r #

gmapQ :: (forall d. Data d => d -> u) -> Installment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Installment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Installment -> m Installment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Installment -> m Installment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Installment -> m Installment #

Show Installment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Installment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Installment :: Type -> Type #

ToJSON Installment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Installment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Installment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Installment = D1 (MetaData "Installment" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Installment'" PrefixI True) (S1 (MetaSel (Just "_iAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_iMonths") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))

installment :: Installment Source #

Creates a value of Installment with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

iAmount :: Lens' Installment (Maybe Price) Source #

The amount the buyer has to pay per month.

iMonths :: Lens' Installment (Maybe Int64) Source #

The number of installments the buyer has to pay.

DatafeedFetchSchedule

data DatafeedFetchSchedule Source #

The required fields vary based on the frequency of fetching. For a monthly fetch schedule, day_of_month and hour are required. For a weekly fetch schedule, weekday and hour are required. For a daily fetch schedule, only hour is required.

See: datafeedFetchSchedule smart constructor.

Instances
Eq DatafeedFetchSchedule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedFetchSchedule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedFetchSchedule -> c DatafeedFetchSchedule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedFetchSchedule #

toConstr :: DatafeedFetchSchedule -> Constr #

dataTypeOf :: DatafeedFetchSchedule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedFetchSchedule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedFetchSchedule) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedFetchSchedule -> DatafeedFetchSchedule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedFetchSchedule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedFetchSchedule -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedFetchSchedule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedFetchSchedule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedFetchSchedule -> m DatafeedFetchSchedule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedFetchSchedule -> m DatafeedFetchSchedule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedFetchSchedule -> m DatafeedFetchSchedule #

Show DatafeedFetchSchedule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedFetchSchedule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedFetchSchedule :: Type -> Type #

ToJSON DatafeedFetchSchedule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedFetchSchedule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedFetchSchedule Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

datafeedFetchSchedule :: DatafeedFetchSchedule Source #

Creates a value of DatafeedFetchSchedule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dfsFetchURL :: Lens' DatafeedFetchSchedule (Maybe Text) Source #

The URL where the feed file can be fetched. Google Merchant Center will support automatic scheduled uploads using the HTTP, HTTPS, FTP, or SFTP protocols, so the value will need to be a valid link using one of those four protocols.

dfsUsername :: Lens' DatafeedFetchSchedule (Maybe Text) Source #

An optional user name for fetch_url.

dfsMinuteOfHour :: Lens' DatafeedFetchSchedule (Maybe Word32) Source #

The minute of the hour the feed file should be fetched (0-59). Read-only.

dfsPassword :: Lens' DatafeedFetchSchedule (Maybe Text) Source #

An optional password for fetch_url.

dfsDayOfMonth :: Lens' DatafeedFetchSchedule (Maybe Word32) Source #

The day of the month the feed file should be fetched (1-31).

dfsHour :: Lens' DatafeedFetchSchedule (Maybe Word32) Source #

The hour of the day the feed file should be fetched (0-23).

dfsWeekday :: Lens' DatafeedFetchSchedule (Maybe Text) Source #

The day of the week the feed file should be fetched.

dfsTimeZone :: Lens' DatafeedFetchSchedule (Maybe Text) Source #

Time zone used for schedule. UTC by default. E.g., "America/Los_Angeles".

dfsPaused :: Lens' DatafeedFetchSchedule (Maybe Bool) Source #

Whether the scheduled fetch is paused or not.

PosStore

data PosStore Source #

Store resource.

See: posStore smart constructor.

Instances
Eq PosStore Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosStore Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosStore -> c PosStore #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosStore #

toConstr :: PosStore -> Constr #

dataTypeOf :: PosStore -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosStore) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosStore) #

gmapT :: (forall b. Data b => b -> b) -> PosStore -> PosStore #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosStore -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosStore -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosStore -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosStore -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosStore -> m PosStore #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosStore -> m PosStore #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosStore -> m PosStore #

Show PosStore Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosStore Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosStore :: Type -> Type #

Methods

from :: PosStore -> Rep PosStore x #

to :: Rep PosStore x -> PosStore #

ToJSON PosStore Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosStore Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosStore Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosStore = D1 (MetaData "PosStore" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosStore'" PrefixI True) (S1 (MetaSel (Just "_pssStoreCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_pssKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_pssStoreAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

posStore :: PosStore Source #

Creates a value of PosStore with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pssStoreCode :: Lens' PosStore (Maybe Text) Source #

A store identifier that is unique for the given merchant.

pssKind :: Lens' PosStore Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#posStore".

pssStoreAddress :: Lens' PosStore (Maybe Text) Source #

The street address of the store.

LiaSettingsSetInventoryVerificationContactResponse

data LiaSettingsSetInventoryVerificationContactResponse Source #

Instances
Eq LiaSettingsSetInventoryVerificationContactResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsSetInventoryVerificationContactResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettingsSetInventoryVerificationContactResponse -> c LiaSettingsSetInventoryVerificationContactResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettingsSetInventoryVerificationContactResponse #

toConstr :: LiaSettingsSetInventoryVerificationContactResponse -> Constr #

dataTypeOf :: LiaSettingsSetInventoryVerificationContactResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettingsSetInventoryVerificationContactResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettingsSetInventoryVerificationContactResponse) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettingsSetInventoryVerificationContactResponse -> LiaSettingsSetInventoryVerificationContactResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsSetInventoryVerificationContactResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsSetInventoryVerificationContactResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettingsSetInventoryVerificationContactResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettingsSetInventoryVerificationContactResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettingsSetInventoryVerificationContactResponse -> m LiaSettingsSetInventoryVerificationContactResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsSetInventoryVerificationContactResponse -> m LiaSettingsSetInventoryVerificationContactResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsSetInventoryVerificationContactResponse -> m LiaSettingsSetInventoryVerificationContactResponse #

Show LiaSettingsSetInventoryVerificationContactResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsSetInventoryVerificationContactResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON LiaSettingsSetInventoryVerificationContactResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsSetInventoryVerificationContactResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsSetInventoryVerificationContactResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsSetInventoryVerificationContactResponse = D1 (MetaData "LiaSettingsSetInventoryVerificationContactResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "LiaSettingsSetInventoryVerificationContactResponse'" PrefixI True) (S1 (MetaSel (Just "_lssivcrKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

liaSettingsSetInventoryVerificationContactResponse :: LiaSettingsSetInventoryVerificationContactResponse Source #

Creates a value of LiaSettingsSetInventoryVerificationContactResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lssivcrKind :: Lens' LiaSettingsSetInventoryVerificationContactResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsSetInventoryVerificationContactResponse".

ShippingSettingsGetSupportedCarriersResponse

data ShippingSettingsGetSupportedCarriersResponse Source #

Instances
Eq ShippingSettingsGetSupportedCarriersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShippingSettingsGetSupportedCarriersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShippingSettingsGetSupportedCarriersResponse -> c ShippingSettingsGetSupportedCarriersResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShippingSettingsGetSupportedCarriersResponse #

toConstr :: ShippingSettingsGetSupportedCarriersResponse -> Constr #

dataTypeOf :: ShippingSettingsGetSupportedCarriersResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShippingSettingsGetSupportedCarriersResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShippingSettingsGetSupportedCarriersResponse) #

gmapT :: (forall b. Data b => b -> b) -> ShippingSettingsGetSupportedCarriersResponse -> ShippingSettingsGetSupportedCarriersResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsGetSupportedCarriersResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsGetSupportedCarriersResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShippingSettingsGetSupportedCarriersResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShippingSettingsGetSupportedCarriersResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShippingSettingsGetSupportedCarriersResponse -> m ShippingSettingsGetSupportedCarriersResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsGetSupportedCarriersResponse -> m ShippingSettingsGetSupportedCarriersResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsGetSupportedCarriersResponse -> m ShippingSettingsGetSupportedCarriersResponse #

Show ShippingSettingsGetSupportedCarriersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShippingSettingsGetSupportedCarriersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON ShippingSettingsGetSupportedCarriersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShippingSettingsGetSupportedCarriersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsGetSupportedCarriersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsGetSupportedCarriersResponse = D1 (MetaData "ShippingSettingsGetSupportedCarriersResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShippingSettingsGetSupportedCarriersResponse'" PrefixI True) (S1 (MetaSel (Just "_ssgscrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ssgscrCarriers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [CarriersCarrier]))))

shippingSettingsGetSupportedCarriersResponse :: ShippingSettingsGetSupportedCarriersResponse Source #

Creates a value of ShippingSettingsGetSupportedCarriersResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ssgscrKind :: Lens' ShippingSettingsGetSupportedCarriersResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#shippingsettingsGetSupportedCarriersResponse".

PosDataProvidersPosDataProvider

data PosDataProvidersPosDataProvider Source #

Instances
Eq PosDataProvidersPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosDataProvidersPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosDataProvidersPosDataProvider -> c PosDataProvidersPosDataProvider #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosDataProvidersPosDataProvider #

toConstr :: PosDataProvidersPosDataProvider -> Constr #

dataTypeOf :: PosDataProvidersPosDataProvider -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosDataProvidersPosDataProvider) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosDataProvidersPosDataProvider) #

gmapT :: (forall b. Data b => b -> b) -> PosDataProvidersPosDataProvider -> PosDataProvidersPosDataProvider #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosDataProvidersPosDataProvider -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosDataProvidersPosDataProvider -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosDataProvidersPosDataProvider -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosDataProvidersPosDataProvider -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosDataProvidersPosDataProvider -> m PosDataProvidersPosDataProvider #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosDataProvidersPosDataProvider -> m PosDataProvidersPosDataProvider #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosDataProvidersPosDataProvider -> m PosDataProvidersPosDataProvider #

Show PosDataProvidersPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosDataProvidersPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosDataProvidersPosDataProvider :: Type -> Type #

ToJSON PosDataProvidersPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosDataProvidersPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosDataProvidersPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosDataProvidersPosDataProvider = D1 (MetaData "PosDataProvidersPosDataProvider" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosDataProvidersPosDataProvider'" PrefixI True) (S1 (MetaSel (Just "_pdppdpProviderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_pdppdpFullName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pdppdpDisplayName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

posDataProvidersPosDataProvider :: PosDataProvidersPosDataProvider Source #

Creates a value of PosDataProvidersPosDataProvider with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pdppdpFullName :: Lens' PosDataProvidersPosDataProvider (Maybe Text) Source #

The full name of this POS data Provider.

pdppdpDisplayName :: Lens' PosDataProvidersPosDataProvider (Maybe Text) Source #

The display name of Pos data Provider.

HolidaysHoliday

data HolidaysHoliday Source #

Instances
Eq HolidaysHoliday Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data HolidaysHoliday Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HolidaysHoliday -> c HolidaysHoliday #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HolidaysHoliday #

toConstr :: HolidaysHoliday -> Constr #

dataTypeOf :: HolidaysHoliday -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HolidaysHoliday) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HolidaysHoliday) #

gmapT :: (forall b. Data b => b -> b) -> HolidaysHoliday -> HolidaysHoliday #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HolidaysHoliday -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HolidaysHoliday -> r #

gmapQ :: (forall d. Data d => d -> u) -> HolidaysHoliday -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HolidaysHoliday -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HolidaysHoliday -> m HolidaysHoliday #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HolidaysHoliday -> m HolidaysHoliday #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HolidaysHoliday -> m HolidaysHoliday #

Show HolidaysHoliday Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic HolidaysHoliday Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep HolidaysHoliday :: Type -> Type #

ToJSON HolidaysHoliday Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON HolidaysHoliday Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep HolidaysHoliday Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep HolidaysHoliday = D1 (MetaData "HolidaysHoliday" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "HolidaysHoliday'" PrefixI True) ((S1 (MetaSel (Just "_hhDeliveryGuaranteeHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_hhDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_hhDeliveryGuaranteeDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_hhCountryCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_hhId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_hhType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

holidaysHoliday :: HolidaysHoliday Source #

Creates a value of HolidaysHoliday with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

hhDeliveryGuaranteeHour :: Lens' HolidaysHoliday (Maybe Word64) Source #

Hour of the day in the delivery location's timezone on the guaranteed delivery date by which the order has to arrive at the customer's. Possible values are: 0 (midnight), 1, ..., 12 (noon), 13, ..., 23. Always present.

hhDate :: Lens' HolidaysHoliday (Maybe Text) Source #

Date of the holiday, in ISO 8601 format. E.g. "2016-12-25" for Christmas 2016. Always present.

hhDeliveryGuaranteeDate :: Lens' HolidaysHoliday (Maybe Text) Source #

Date on which the order has to arrive at the customer's, in ISO 8601 format. E.g. "2016-12-24" for 24th December 2016. Always present.

hhCountryCode :: Lens' HolidaysHoliday (Maybe Text) Source #

The CLDR territory code of the country in which the holiday is available. E.g. "US", "DE", "GB". A holiday cutoff can only be configured in a shipping settings service with matching delivery country. Always present.

hhId :: Lens' HolidaysHoliday (Maybe Text) Source #

Unique identifier for the holiday to be used when configuring holiday cutoffs. Always present.

hhType :: Lens' HolidaysHoliday (Maybe Text) Source #

The holiday type. Always present.

AccountsListResponse

data AccountsListResponse Source #

Instances
Eq AccountsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountsListResponse -> c AccountsListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountsListResponse #

toConstr :: AccountsListResponse -> Constr #

dataTypeOf :: AccountsListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountsListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountsListResponse) #

gmapT :: (forall b. Data b => b -> b) -> AccountsListResponse -> AccountsListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountsListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountsListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountsListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountsListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountsListResponse -> m AccountsListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsListResponse -> m AccountsListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsListResponse -> m AccountsListResponse #

Show AccountsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsListResponse :: Type -> Type #

ToJSON AccountsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsListResponse = D1 (MetaData "AccountsListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountsListResponse'" PrefixI True) (S1 (MetaSel (Just "_accNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_accKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_accResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Account])))))

accountsListResponse :: AccountsListResponse Source #

Creates a value of AccountsListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

accNextPageToken :: Lens' AccountsListResponse (Maybe Text) Source #

The token for the retrieval of the next page of accounts.

accKind :: Lens' AccountsListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountsListResponse".

OrderpaymentsNotifyRefundRequest

data OrderpaymentsNotifyRefundRequest Source #

Instances
Eq OrderpaymentsNotifyRefundRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderpaymentsNotifyRefundRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderpaymentsNotifyRefundRequest -> c OrderpaymentsNotifyRefundRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderpaymentsNotifyRefundRequest #

toConstr :: OrderpaymentsNotifyRefundRequest -> Constr #

dataTypeOf :: OrderpaymentsNotifyRefundRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderpaymentsNotifyRefundRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderpaymentsNotifyRefundRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrderpaymentsNotifyRefundRequest -> OrderpaymentsNotifyRefundRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyRefundRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyRefundRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderpaymentsNotifyRefundRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderpaymentsNotifyRefundRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyRefundRequest -> m OrderpaymentsNotifyRefundRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyRefundRequest -> m OrderpaymentsNotifyRefundRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyRefundRequest -> m OrderpaymentsNotifyRefundRequest #

Show OrderpaymentsNotifyRefundRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderpaymentsNotifyRefundRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderpaymentsNotifyRefundRequest :: Type -> Type #

ToJSON OrderpaymentsNotifyRefundRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderpaymentsNotifyRefundRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyRefundRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyRefundRequest = D1 (MetaData "OrderpaymentsNotifyRefundRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderpaymentsNotifyRefundRequest'" PrefixI True) (S1 (MetaSel (Just "_onrrInvoiceIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_onrrRefundState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderpaymentsNotifyRefundRequest :: OrderpaymentsNotifyRefundRequest Source #

Creates a value of OrderpaymentsNotifyRefundRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

onrrInvoiceIds :: Lens' OrderpaymentsNotifyRefundRequest [Text] Source #

Invoice IDs from the orderinvoices service that correspond to the refund.

AccountBusinessInformation

data AccountBusinessInformation Source #

Instances
Eq AccountBusinessInformation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountBusinessInformation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountBusinessInformation -> c AccountBusinessInformation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountBusinessInformation #

toConstr :: AccountBusinessInformation -> Constr #

dataTypeOf :: AccountBusinessInformation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountBusinessInformation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountBusinessInformation) #

gmapT :: (forall b. Data b => b -> b) -> AccountBusinessInformation -> AccountBusinessInformation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountBusinessInformation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountBusinessInformation -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountBusinessInformation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountBusinessInformation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountBusinessInformation -> m AccountBusinessInformation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountBusinessInformation -> m AccountBusinessInformation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountBusinessInformation -> m AccountBusinessInformation #

Show AccountBusinessInformation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountBusinessInformation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountBusinessInformation :: Type -> Type #

ToJSON AccountBusinessInformation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountBusinessInformation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountBusinessInformation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountBusinessInformation = D1 (MetaData "AccountBusinessInformation" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountBusinessInformation'" PrefixI True) (S1 (MetaSel (Just "_abiAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AccountAddress)) :*: (S1 (MetaSel (Just "_abiPhoneNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_abiCustomerService") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AccountCustomerService)))))

accountBusinessInformation :: AccountBusinessInformation Source #

Creates a value of AccountBusinessInformation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

abiPhoneNumber :: Lens' AccountBusinessInformation (Maybe Text) Source #

The phone number of the business.

abiCustomerService :: Lens' AccountBusinessInformation (Maybe AccountCustomerService) Source #

The customer service information of the business.

CarriersCarrier

data CarriersCarrier Source #

Instances
Eq CarriersCarrier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data CarriersCarrier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CarriersCarrier -> c CarriersCarrier #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CarriersCarrier #

toConstr :: CarriersCarrier -> Constr #

dataTypeOf :: CarriersCarrier -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CarriersCarrier) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CarriersCarrier) #

gmapT :: (forall b. Data b => b -> b) -> CarriersCarrier -> CarriersCarrier #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CarriersCarrier -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CarriersCarrier -> r #

gmapQ :: (forall d. Data d => d -> u) -> CarriersCarrier -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CarriersCarrier -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CarriersCarrier -> m CarriersCarrier #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CarriersCarrier -> m CarriersCarrier #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CarriersCarrier -> m CarriersCarrier #

Show CarriersCarrier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic CarriersCarrier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep CarriersCarrier :: Type -> Type #

ToJSON CarriersCarrier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON CarriersCarrier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CarriersCarrier Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CarriersCarrier = D1 (MetaData "CarriersCarrier" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "CarriersCarrier'" PrefixI True) (S1 (MetaSel (Just "_ccCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ccName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ccServices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))

carriersCarrier :: CarriersCarrier Source #

Creates a value of CarriersCarrier with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ccCountry :: Lens' CarriersCarrier (Maybe Text) Source #

The CLDR country code of the carrier (e.g., "US"). Always present.

ccName :: Lens' CarriersCarrier (Maybe Text) Source #

The name of the carrier (e.g., "UPS"). Always present.

ccServices :: Lens' CarriersCarrier [Text] Source #

A list of supported services (e.g., "ground") for that carrier. Contains at least one service.

CarrierRate

data CarrierRate Source #

Instances
Eq CarrierRate Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data CarrierRate Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CarrierRate -> c CarrierRate #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CarrierRate #

toConstr :: CarrierRate -> Constr #

dataTypeOf :: CarrierRate -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CarrierRate) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CarrierRate) #

gmapT :: (forall b. Data b => b -> b) -> CarrierRate -> CarrierRate #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CarrierRate -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CarrierRate -> r #

gmapQ :: (forall d. Data d => d -> u) -> CarrierRate -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CarrierRate -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CarrierRate -> m CarrierRate #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CarrierRate -> m CarrierRate #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CarrierRate -> m CarrierRate #

Show CarrierRate Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic CarrierRate Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep CarrierRate :: Type -> Type #

ToJSON CarrierRate Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON CarrierRate Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CarrierRate Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CarrierRate = D1 (MetaData "CarrierRate" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "CarrierRate'" PrefixI True) ((S1 (MetaSel (Just "_crOriginPostalCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_crFlatAdjustment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_crCarrierService") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_crName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_crPercentageAdjustment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_crCarrierName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

carrierRate :: CarrierRate Source #

Creates a value of CarrierRate with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

crOriginPostalCode :: Lens' CarrierRate (Maybe Text) Source #

Shipping origin for this carrier rate. Required.

crFlatAdjustment :: Lens' CarrierRate (Maybe Price) Source #

Additive shipping rate modifier. Can be negative. For example { "value": "1", "currency" : "USD" } adds $1 to the rate, { "value": "-3", "currency" : "USD" } removes $3 from the rate. Optional.

crCarrierService :: Lens' CarrierRate (Maybe Text) Source #

Carrier service, such as "ground" or "2 days". The list of supported services for a carrier can be retrieved via the getSupportedCarriers method. Required.

crName :: Lens' CarrierRate (Maybe Text) Source #

Name of the carrier rate. Must be unique per rate group. Required.

crPercentageAdjustment :: Lens' CarrierRate (Maybe Text) Source #

Multiplicative shipping rate modifier as a number in decimal notation. Can be negative. For example "5.4" increases the rate by 5.4%, "-3" decreases the rate by 3%. Optional.

crCarrierName :: Lens' CarrierRate (Maybe Text) Source #

Carrier service, such as "UPS" or "Fedex". The list of supported carriers can be retrieved via the getSupportedCarriers method. Required.

ShippingSettingsListResponse

data ShippingSettingsListResponse Source #

Instances
Eq ShippingSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShippingSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShippingSettingsListResponse -> c ShippingSettingsListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShippingSettingsListResponse #

toConstr :: ShippingSettingsListResponse -> Constr #

dataTypeOf :: ShippingSettingsListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShippingSettingsListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShippingSettingsListResponse) #

gmapT :: (forall b. Data b => b -> b) -> ShippingSettingsListResponse -> ShippingSettingsListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShippingSettingsListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShippingSettingsListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShippingSettingsListResponse -> m ShippingSettingsListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsListResponse -> m ShippingSettingsListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsListResponse -> m ShippingSettingsListResponse #

Show ShippingSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShippingSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ShippingSettingsListResponse :: Type -> Type #

ToJSON ShippingSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShippingSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsListResponse = D1 (MetaData "ShippingSettingsListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShippingSettingsListResponse'" PrefixI True) (S1 (MetaSel (Just "_sslrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_sslrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_sslrResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ShippingSettings])))))

shippingSettingsListResponse :: ShippingSettingsListResponse Source #

Creates a value of ShippingSettingsListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sslrNextPageToken :: Lens' ShippingSettingsListResponse (Maybe Text) Source #

The token for the retrieval of the next page of shipping settings.

sslrKind :: Lens' ShippingSettingsListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#shippingsettingsListResponse".

OrdersCreateTestReturnResponse

data OrdersCreateTestReturnResponse Source #

Instances
Eq OrdersCreateTestReturnResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCreateTestReturnResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCreateTestReturnResponse -> c OrdersCreateTestReturnResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCreateTestReturnResponse #

toConstr :: OrdersCreateTestReturnResponse -> Constr #

dataTypeOf :: OrdersCreateTestReturnResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCreateTestReturnResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCreateTestReturnResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCreateTestReturnResponse -> OrdersCreateTestReturnResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCreateTestReturnResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCreateTestReturnResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCreateTestReturnResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCreateTestReturnResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCreateTestReturnResponse -> m OrdersCreateTestReturnResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCreateTestReturnResponse -> m OrdersCreateTestReturnResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCreateTestReturnResponse -> m OrdersCreateTestReturnResponse #

Show OrdersCreateTestReturnResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCreateTestReturnResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersCreateTestReturnResponse :: Type -> Type #

ToJSON OrdersCreateTestReturnResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCreateTestReturnResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCreateTestReturnResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCreateTestReturnResponse = D1 (MetaData "OrdersCreateTestReturnResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCreateTestReturnResponse'" PrefixI True) (S1 (MetaSel (Just "_octrrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_octrrReturnId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersCreateTestReturnResponse :: OrdersCreateTestReturnResponse Source #

Creates a value of OrdersCreateTestReturnResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

octrrKind :: Lens' OrdersCreateTestReturnResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersCreateTestReturnResponse".

octrrReturnId :: Lens' OrdersCreateTestReturnResponse (Maybe Text) Source #

The ID of the newly created test order return.

OrdersShipLineItemsRequest

data OrdersShipLineItemsRequest Source #

Instances
Eq OrdersShipLineItemsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersShipLineItemsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersShipLineItemsRequest -> c OrdersShipLineItemsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersShipLineItemsRequest #

toConstr :: OrdersShipLineItemsRequest -> Constr #

dataTypeOf :: OrdersShipLineItemsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersShipLineItemsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersShipLineItemsRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersShipLineItemsRequest -> OrdersShipLineItemsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersShipLineItemsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersShipLineItemsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersShipLineItemsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersShipLineItemsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersShipLineItemsRequest -> m OrdersShipLineItemsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersShipLineItemsRequest -> m OrdersShipLineItemsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersShipLineItemsRequest -> m OrdersShipLineItemsRequest #

Show OrdersShipLineItemsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersShipLineItemsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersShipLineItemsRequest :: Type -> Type #

ToJSON OrdersShipLineItemsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersShipLineItemsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersShipLineItemsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersShipLineItemsRequest = D1 (MetaData "OrdersShipLineItemsRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersShipLineItemsRequest'" PrefixI True) ((S1 (MetaSel (Just "_oslirShipmentGroupId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oslirShipmentInfos") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo]))) :*: (S1 (MetaSel (Just "_oslirLineItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderShipmentLineItemShipment])) :*: S1 (MetaSel (Just "_oslirOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

ordersShipLineItemsRequest :: OrdersShipLineItemsRequest Source #

Creates a value of OrdersShipLineItemsRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oslirShipmentGroupId :: Lens' OrdersShipLineItemsRequest (Maybe Text) Source #

ID of the shipment group. Required for orders that use the orderinvoices service.

oslirShipmentInfos :: Lens' OrdersShipLineItemsRequest [OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo] Source #

Shipment information. This field is repeated because a single line item can be shipped in several packages (and have several tracking IDs).

oslirOperationId :: Lens' OrdersShipLineItemsRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

OrderreturnsListResponse

data OrderreturnsListResponse Source #

Instances
Eq OrderreturnsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderreturnsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderreturnsListResponse -> c OrderreturnsListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderreturnsListResponse #

toConstr :: OrderreturnsListResponse -> Constr #

dataTypeOf :: OrderreturnsListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderreturnsListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderreturnsListResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrderreturnsListResponse -> OrderreturnsListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderreturnsListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderreturnsListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderreturnsListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderreturnsListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderreturnsListResponse -> m OrderreturnsListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderreturnsListResponse -> m OrderreturnsListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderreturnsListResponse -> m OrderreturnsListResponse #

Show OrderreturnsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderreturnsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderreturnsListResponse :: Type -> Type #

ToJSON OrderreturnsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderreturnsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderreturnsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderreturnsListResponse = D1 (MetaData "OrderreturnsListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderreturnsListResponse'" PrefixI True) (S1 (MetaSel (Just "_olrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_olrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_olrResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [MerchantOrderReturn])))))

orderreturnsListResponse :: OrderreturnsListResponse Source #

Creates a value of OrderreturnsListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

olrNextPageToken :: Lens' OrderreturnsListResponse (Maybe Text) Source #

The token for the retrieval of the next page of returns.

olrKind :: Lens' OrderreturnsListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderreturnsListResponse".

AccountsCustomBatchResponse

data AccountsCustomBatchResponse Source #

Instances
Eq AccountsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountsCustomBatchResponse -> c AccountsCustomBatchResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountsCustomBatchResponse #

toConstr :: AccountsCustomBatchResponse -> Constr #

dataTypeOf :: AccountsCustomBatchResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountsCustomBatchResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountsCustomBatchResponse) #

gmapT :: (forall b. Data b => b -> b) -> AccountsCustomBatchResponse -> AccountsCustomBatchResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountsCustomBatchResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountsCustomBatchResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountsCustomBatchResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountsCustomBatchResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountsCustomBatchResponse -> m AccountsCustomBatchResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsCustomBatchResponse -> m AccountsCustomBatchResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsCustomBatchResponse -> m AccountsCustomBatchResponse #

Show AccountsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsCustomBatchResponse :: Type -> Type #

ToJSON AccountsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchResponse = D1 (MetaData "AccountsCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountsCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_acbrcEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountsCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_acbrcKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

accountsCustomBatchResponse :: AccountsCustomBatchResponse Source #

Creates a value of AccountsCustomBatchResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acbrcEntries :: Lens' AccountsCustomBatchResponse [AccountsCustomBatchResponseEntry] Source #

The result of the execution of the batch requests.

acbrcKind :: Lens' AccountsCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountsCustomBatchResponse".

OrderpaymentsNotifyAuthApprovedRequest

data OrderpaymentsNotifyAuthApprovedRequest Source #

Instances
Eq OrderpaymentsNotifyAuthApprovedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderpaymentsNotifyAuthApprovedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderpaymentsNotifyAuthApprovedRequest -> c OrderpaymentsNotifyAuthApprovedRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderpaymentsNotifyAuthApprovedRequest #

toConstr :: OrderpaymentsNotifyAuthApprovedRequest -> Constr #

dataTypeOf :: OrderpaymentsNotifyAuthApprovedRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderpaymentsNotifyAuthApprovedRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderpaymentsNotifyAuthApprovedRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrderpaymentsNotifyAuthApprovedRequest -> OrderpaymentsNotifyAuthApprovedRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyAuthApprovedRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyAuthApprovedRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderpaymentsNotifyAuthApprovedRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderpaymentsNotifyAuthApprovedRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthApprovedRequest -> m OrderpaymentsNotifyAuthApprovedRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthApprovedRequest -> m OrderpaymentsNotifyAuthApprovedRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthApprovedRequest -> m OrderpaymentsNotifyAuthApprovedRequest #

Show OrderpaymentsNotifyAuthApprovedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderpaymentsNotifyAuthApprovedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderpaymentsNotifyAuthApprovedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderpaymentsNotifyAuthApprovedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyAuthApprovedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyAuthApprovedRequest = D1 (MetaData "OrderpaymentsNotifyAuthApprovedRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderpaymentsNotifyAuthApprovedRequest'" PrefixI True) (S1 (MetaSel (Just "_onaarAuthAmountPretax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_onaarAuthAmountTax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))))

orderpaymentsNotifyAuthApprovedRequest :: OrderpaymentsNotifyAuthApprovedRequest Source #

Creates a value of OrderpaymentsNotifyAuthApprovedRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

OrdersUpdateLineItemShippingDetailsRequest

data OrdersUpdateLineItemShippingDetailsRequest Source #

Instances
Eq OrdersUpdateLineItemShippingDetailsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersUpdateLineItemShippingDetailsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersUpdateLineItemShippingDetailsRequest -> c OrdersUpdateLineItemShippingDetailsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersUpdateLineItemShippingDetailsRequest #

toConstr :: OrdersUpdateLineItemShippingDetailsRequest -> Constr #

dataTypeOf :: OrdersUpdateLineItemShippingDetailsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersUpdateLineItemShippingDetailsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersUpdateLineItemShippingDetailsRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersUpdateLineItemShippingDetailsRequest -> OrdersUpdateLineItemShippingDetailsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersUpdateLineItemShippingDetailsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersUpdateLineItemShippingDetailsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersUpdateLineItemShippingDetailsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersUpdateLineItemShippingDetailsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersUpdateLineItemShippingDetailsRequest -> m OrdersUpdateLineItemShippingDetailsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersUpdateLineItemShippingDetailsRequest -> m OrdersUpdateLineItemShippingDetailsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersUpdateLineItemShippingDetailsRequest -> m OrdersUpdateLineItemShippingDetailsRequest #

Show OrdersUpdateLineItemShippingDetailsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersUpdateLineItemShippingDetailsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrdersUpdateLineItemShippingDetailsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersUpdateLineItemShippingDetailsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateLineItemShippingDetailsRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateLineItemShippingDetailsRequest = D1 (MetaData "OrdersUpdateLineItemShippingDetailsRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersUpdateLineItemShippingDetailsRequest'" PrefixI True) ((S1 (MetaSel (Just "_oulisdrShipByDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oulisdrLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_oulisdrDeliverByDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oulisdrOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oulisdrProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

oulisdrShipByDate :: Lens' OrdersUpdateLineItemShippingDetailsRequest (Maybe Text) Source #

Updated ship by date, in ISO 8601 format. If not specified only deliver by date is updated.

oulisdrLineItemId :: Lens' OrdersUpdateLineItemShippingDetailsRequest (Maybe Text) Source #

The ID of the line item to set metadata. Either lineItemId or productId is required.

oulisdrDeliverByDate :: Lens' OrdersUpdateLineItemShippingDetailsRequest (Maybe Text) Source #

Updated delivery by date, in ISO 8601 format. If not specified only ship by date is updated.

oulisdrOperationId :: Lens' OrdersUpdateLineItemShippingDetailsRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

oulisdrProductId :: Lens' OrdersUpdateLineItemShippingDetailsRequest (Maybe Text) Source #

The ID of the product to set metadata. This is the REST ID used in the products service. Either lineItemId or productId is required.

MerchantOrderReturn

data MerchantOrderReturn Source #

Instances
Eq MerchantOrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data MerchantOrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MerchantOrderReturn -> c MerchantOrderReturn #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MerchantOrderReturn #

toConstr :: MerchantOrderReturn -> Constr #

dataTypeOf :: MerchantOrderReturn -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MerchantOrderReturn) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MerchantOrderReturn) #

gmapT :: (forall b. Data b => b -> b) -> MerchantOrderReturn -> MerchantOrderReturn #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MerchantOrderReturn -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MerchantOrderReturn -> r #

gmapQ :: (forall d. Data d => d -> u) -> MerchantOrderReturn -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MerchantOrderReturn -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MerchantOrderReturn -> m MerchantOrderReturn #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MerchantOrderReturn -> m MerchantOrderReturn #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MerchantOrderReturn -> m MerchantOrderReturn #

Show MerchantOrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic MerchantOrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep MerchantOrderReturn :: Type -> Type #

ToJSON MerchantOrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON MerchantOrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep MerchantOrderReturn Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep MerchantOrderReturn = D1 (MetaData "MerchantOrderReturn" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "MerchantOrderReturn'" PrefixI True) ((S1 (MetaSel (Just "_morReturnShipments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ReturnShipment])) :*: (S1 (MetaSel (Just "_morMerchantOrderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_morReturnItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [MerchantOrderReturnItem])))) :*: (S1 (MetaSel (Just "_morCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_morOrderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_morOrderReturnId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

merchantOrderReturn :: MerchantOrderReturn Source #

Creates a value of MerchantOrderReturn with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ProductTax

data ProductTax Source #

Instances
Eq ProductTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductTax -> c ProductTax #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductTax #

toConstr :: ProductTax -> Constr #

dataTypeOf :: ProductTax -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductTax) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductTax) #

gmapT :: (forall b. Data b => b -> b) -> ProductTax -> ProductTax #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductTax -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductTax -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductTax -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductTax -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductTax -> m ProductTax #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductTax -> m ProductTax #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductTax -> m ProductTax #

Show ProductTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductTax :: Type -> Type #

ToJSON ProductTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductTax Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductTax = D1 (MetaData "ProductTax" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductTax'" PrefixI True) ((S1 (MetaSel (Just "_ptTaxShip") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_ptCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ptPostalCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_ptRate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: (S1 (MetaSel (Just "_ptRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ptLocationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))))

productTax :: ProductTax Source #

Creates a value of ProductTax with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ptTaxShip :: Lens' ProductTax (Maybe Bool) Source #

Set to true if tax is charged on shipping.

ptCountry :: Lens' ProductTax (Maybe Text) Source #

The country within which the item is taxed, specified as a CLDR territory code.

ptPostalCode :: Lens' ProductTax (Maybe Text) Source #

The postal code range that the tax rate applies to, represented by a ZIP code, a ZIP code prefix using * wildcard, a range between two ZIP codes or two ZIP code prefixes of equal length. Examples: 94114, 94*, 94002-95460, 94*-95*.

ptRate :: Lens' ProductTax (Maybe Double) Source #

The percentage of tax rate that applies to the item price.

ptRegion :: Lens' ProductTax (Maybe Text) Source #

The geographic region to which the tax rate applies.

ptLocationId :: Lens' ProductTax (Maybe Int64) Source #

The numeric id of a location that the tax rate applies to as defined in the AdWords API.

PosCustomBatchRequestEntry

data PosCustomBatchRequestEntry Source #

Instances
Eq PosCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosCustomBatchRequestEntry -> c PosCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosCustomBatchRequestEntry #

toConstr :: PosCustomBatchRequestEntry -> Constr #

dataTypeOf :: PosCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> PosCustomBatchRequestEntry -> PosCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosCustomBatchRequestEntry -> m PosCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosCustomBatchRequestEntry -> m PosCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosCustomBatchRequestEntry -> m PosCustomBatchRequestEntry #

Show PosCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosCustomBatchRequestEntry :: Type -> Type #

ToJSON PosCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosCustomBatchRequestEntry = D1 (MetaData "PosCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosCustomBatchRequestEntry'" PrefixI True) (((S1 (MetaSel (Just "_pcbreMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_pcbreStoreCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_pcbreTargetMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_pcbreMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_pcbreStore") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PosStore)) :*: S1 (MetaSel (Just "_pcbreInventory") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PosInventory))) :*: (S1 (MetaSel (Just "_pcbreSale") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PosSale)) :*: S1 (MetaSel (Just "_pcbreBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

posCustomBatchRequestEntry :: PosCustomBatchRequestEntry Source #

Creates a value of PosCustomBatchRequestEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pcbreMerchantId :: Lens' PosCustomBatchRequestEntry (Maybe Word64) Source #

The ID of the POS data provider.

pcbreStoreCode :: Lens' PosCustomBatchRequestEntry (Maybe Text) Source #

The store code. Set this only if the method is delete or get.

pcbreTargetMerchantId :: Lens' PosCustomBatchRequestEntry (Maybe Word64) Source #

The ID of the account for which to get/submit data.

pcbreStore :: Lens' PosCustomBatchRequestEntry (Maybe PosStore) Source #

The store information to submit. Set this only if the method is insert.

pcbreInventory :: Lens' PosCustomBatchRequestEntry (Maybe PosInventory) Source #

The inventory to submit. Set this only if the method is inventory.

pcbreSale :: Lens' PosCustomBatchRequestEntry (Maybe PosSale) Source #

The sale information to submit. Set this only if the method is sale.

pcbreBatchId :: Lens' PosCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

OrderShipment

data OrderShipment Source #

Instances
Eq OrderShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderShipment -> c OrderShipment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderShipment #

toConstr :: OrderShipment -> Constr #

dataTypeOf :: OrderShipment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderShipment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderShipment) #

gmapT :: (forall b. Data b => b -> b) -> OrderShipment -> OrderShipment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderShipment -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderShipment -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderShipment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderShipment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderShipment -> m OrderShipment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderShipment -> m OrderShipment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderShipment -> m OrderShipment #

Show OrderShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderShipment :: Type -> Type #

ToJSON OrderShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

orderShipment :: OrderShipment Source #

Creates a value of OrderShipment with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

osCarrier :: Lens' OrderShipment (Maybe Text) Source #

The carrier handling the shipment. Acceptable values for US are: - "gsx" - "ups" - "usps" - "fedex" - "dhl" - "ecourier" - "cxt" - "google" - "ontrac" - "emsy" - "ont" - "deliv" - "dynamex" - "lasership" - "mpx" - "uds" Acceptable values for FR are: - "colissimo" - "chronopost"

osStatus :: Lens' OrderShipment (Maybe Text) Source #

The status of the shipment.

osTrackingId :: Lens' OrderShipment (Maybe Text) Source #

The tracking id for the shipment.

osId :: Lens' OrderShipment (Maybe Text) Source #

The id of the shipment.

osCreationDate :: Lens' OrderShipment (Maybe Text) Source #

Date on which the shipment has been created, in ISO 8601 format.

osDeliveryDate :: Lens' OrderShipment (Maybe Text) Source #

Date on which the shipment has been delivered, in ISO 8601 format. Present only if status is delivered

AccountsLinkResponse

data AccountsLinkResponse Source #

Instances
Eq AccountsLinkResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsLinkResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountsLinkResponse -> c AccountsLinkResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountsLinkResponse #

toConstr :: AccountsLinkResponse -> Constr #

dataTypeOf :: AccountsLinkResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountsLinkResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountsLinkResponse) #

gmapT :: (forall b. Data b => b -> b) -> AccountsLinkResponse -> AccountsLinkResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountsLinkResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountsLinkResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountsLinkResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountsLinkResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountsLinkResponse -> m AccountsLinkResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsLinkResponse -> m AccountsLinkResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsLinkResponse -> m AccountsLinkResponse #

Show AccountsLinkResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsLinkResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsLinkResponse :: Type -> Type #

ToJSON AccountsLinkResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsLinkResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsLinkResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsLinkResponse = D1 (MetaData "AccountsLinkResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "AccountsLinkResponse'" PrefixI True) (S1 (MetaSel (Just "_alrlKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

accountsLinkResponse :: AccountsLinkResponse Source #

Creates a value of AccountsLinkResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

alrlKind :: Lens' AccountsLinkResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountsLinkResponse".

OrderLineItemReturnInfo

data OrderLineItemReturnInfo Source #

Instances
Eq OrderLineItemReturnInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderLineItemReturnInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderLineItemReturnInfo -> c OrderLineItemReturnInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderLineItemReturnInfo #

toConstr :: OrderLineItemReturnInfo -> Constr #

dataTypeOf :: OrderLineItemReturnInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderLineItemReturnInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderLineItemReturnInfo) #

gmapT :: (forall b. Data b => b -> b) -> OrderLineItemReturnInfo -> OrderLineItemReturnInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemReturnInfo -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemReturnInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderLineItemReturnInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderLineItemReturnInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderLineItemReturnInfo -> m OrderLineItemReturnInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemReturnInfo -> m OrderLineItemReturnInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemReturnInfo -> m OrderLineItemReturnInfo #

Show OrderLineItemReturnInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderLineItemReturnInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderLineItemReturnInfo :: Type -> Type #

ToJSON OrderLineItemReturnInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderLineItemReturnInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemReturnInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemReturnInfo = D1 (MetaData "OrderLineItemReturnInfo" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderLineItemReturnInfo'" PrefixI True) (S1 (MetaSel (Just "_oliriIsReturnable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_oliriPolicyURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oliriDaysToReturn") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

orderLineItemReturnInfo :: OrderLineItemReturnInfo Source #

Creates a value of OrderLineItemReturnInfo with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oliriIsReturnable :: Lens' OrderLineItemReturnInfo (Maybe Bool) Source #

Whether the item is returnable.

oliriPolicyURL :: Lens' OrderLineItemReturnInfo (Maybe Text) Source #

URL of the item return policy.

oliriDaysToReturn :: Lens' OrderLineItemReturnInfo (Maybe Int32) Source #

How many days later the item can be returned.

Account

data Account Source #

Account data. After the creation of a new account it may take a few minutes before it is fully operational. The methods delete, insert, patch, and update require the admin role.

See: account smart constructor.

Instances
Eq Account Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Account -> Account -> Bool #

(/=) :: Account -> Account -> Bool #

Data Account Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Account -> c Account #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Account #

toConstr :: Account -> Constr #

dataTypeOf :: Account -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Account) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Account) #

gmapT :: (forall b. Data b => b -> b) -> Account -> Account #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Account -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Account -> r #

gmapQ :: (forall d. Data d => d -> u) -> Account -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Account -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Account -> m Account #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Account -> m Account #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Account -> m Account #

Show Account Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Account Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Account :: Type -> Type #

Methods

from :: Account -> Rep Account x #

to :: Rep Account x -> Account #

ToJSON Account Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Account Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Account Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

account :: Account Source #

Creates a value of Account with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aaUsers :: Lens' Account [AccountUser] Source #

Users with access to the account. Every account (except for subaccounts) must have at least one admin user.

aaYouTubeChannelLinks :: Lens' Account [AccountYouTubeChannelLink] Source #

List of linked YouTube channels that are active or pending approval. To create a new link request, add a new link with status active to the list. It will remain in a pending state until approved or rejected in the YT Creator Studio interface. To delete an active link, or to cancel a link request, remove it from the list.

aaKind :: Lens' Account Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#account".

aaSellerId :: Lens' Account (Maybe Text) Source #

Client-specific, locally-unique, internal ID for the child account.

aaName :: Lens' Account (Maybe Text) Source #

Display name for the account.

aaBusinessInformation :: Lens' Account (Maybe AccountBusinessInformation) Source #

The business information of the account.

aaId :: Lens' Account (Maybe Word64) Source #

Merchant Center account ID.

aaAdsLinks :: Lens' Account [AccountAdsLink] Source #

List of linked Ads accounts that are active or pending approval. To create a new link request, add a new link with status active to the list. It will remain in a pending state until approved or rejected either in the Ads interface or through the AdWords API. To delete an active link, or to cancel a link request, remove it from the list.

aaWebsiteURL :: Lens' Account (Maybe Text) Source #

The merchant's website.

aaGoogleMyBusinessLink :: Lens' Account (Maybe AccountGoogleMyBusinessLink) Source #

The GMB account which is linked or in the process of being linked with the Merchant Center account.

aaAdultContent :: Lens' Account (Maybe Bool) Source #

Indicates whether the merchant sells adult content.

ShipmentTrackingInfo

data ShipmentTrackingInfo Source #

Instances
Eq ShipmentTrackingInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShipmentTrackingInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShipmentTrackingInfo -> c ShipmentTrackingInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShipmentTrackingInfo #

toConstr :: ShipmentTrackingInfo -> Constr #

dataTypeOf :: ShipmentTrackingInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShipmentTrackingInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShipmentTrackingInfo) #

gmapT :: (forall b. Data b => b -> b) -> ShipmentTrackingInfo -> ShipmentTrackingInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShipmentTrackingInfo -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShipmentTrackingInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShipmentTrackingInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShipmentTrackingInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShipmentTrackingInfo -> m ShipmentTrackingInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShipmentTrackingInfo -> m ShipmentTrackingInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShipmentTrackingInfo -> m ShipmentTrackingInfo #

Show ShipmentTrackingInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShipmentTrackingInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ShipmentTrackingInfo :: Type -> Type #

ToJSON ShipmentTrackingInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShipmentTrackingInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShipmentTrackingInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShipmentTrackingInfo = D1 (MetaData "ShipmentTrackingInfo" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShipmentTrackingInfo'" PrefixI True) (S1 (MetaSel (Just "_stiCarrier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_stiTrackingNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

shipmentTrackingInfo :: ShipmentTrackingInfo Source #

Creates a value of ShipmentTrackingInfo with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

OrdersCancelLineItemRequest

data OrdersCancelLineItemRequest Source #

Instances
Eq OrdersCancelLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCancelLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCancelLineItemRequest -> c OrdersCancelLineItemRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCancelLineItemRequest #

toConstr :: OrdersCancelLineItemRequest -> Constr #

dataTypeOf :: OrdersCancelLineItemRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCancelLineItemRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCancelLineItemRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCancelLineItemRequest -> OrdersCancelLineItemRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelLineItemRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelLineItemRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCancelLineItemRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCancelLineItemRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCancelLineItemRequest -> m OrdersCancelLineItemRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelLineItemRequest -> m OrdersCancelLineItemRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelLineItemRequest -> m OrdersCancelLineItemRequest #

Show OrdersCancelLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCancelLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersCancelLineItemRequest :: Type -> Type #

ToJSON OrdersCancelLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCancelLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelLineItemRequest = D1 (MetaData "OrdersCancelLineItemRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCancelLineItemRequest'" PrefixI True) ((S1 (MetaSel (Just "_oclirQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: (S1 (MetaSel (Just "_oclirLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oclirReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_oclirOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oclirProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oclirReasonText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

ordersCancelLineItemRequest :: OrdersCancelLineItemRequest Source #

Creates a value of OrdersCancelLineItemRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oclirLineItemId :: Lens' OrdersCancelLineItemRequest (Maybe Text) Source #

The ID of the line item to cancel. Either lineItemId or productId is required.

oclirReason :: Lens' OrdersCancelLineItemRequest (Maybe Text) Source #

The reason for the cancellation.

oclirOperationId :: Lens' OrdersCancelLineItemRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

oclirProductId :: Lens' OrdersCancelLineItemRequest (Maybe Text) Source #

The ID of the product to cancel. This is the REST ID used in the products service. Either lineItemId or productId is required.

ProductShippingWeight

data ProductShippingWeight Source #

Instances
Eq ProductShippingWeight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductShippingWeight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductShippingWeight -> c ProductShippingWeight #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductShippingWeight #

toConstr :: ProductShippingWeight -> Constr #

dataTypeOf :: ProductShippingWeight -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductShippingWeight) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductShippingWeight) #

gmapT :: (forall b. Data b => b -> b) -> ProductShippingWeight -> ProductShippingWeight #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductShippingWeight -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductShippingWeight -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductShippingWeight -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductShippingWeight -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductShippingWeight -> m ProductShippingWeight #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductShippingWeight -> m ProductShippingWeight #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductShippingWeight -> m ProductShippingWeight #

Show ProductShippingWeight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductShippingWeight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductShippingWeight :: Type -> Type #

ToJSON ProductShippingWeight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductShippingWeight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductShippingWeight Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductShippingWeight = D1 (MetaData "ProductShippingWeight" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductShippingWeight'" PrefixI True) (S1 (MetaSel (Just "_pswValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_pswUnit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

productShippingWeight :: ProductShippingWeight Source #

Creates a value of ProductShippingWeight with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pswValue :: Lens' ProductShippingWeight (Maybe Double) Source #

The weight of the product used to calculate the shipping cost of the item.

AccountstatusesCustomBatchRequestEntry

data AccountstatusesCustomBatchRequestEntry Source #

A batch entry encoding a single non-batch accountstatuses request.

See: accountstatusesCustomBatchRequestEntry smart constructor.

Instances
Eq AccountstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountstatusesCustomBatchRequestEntry -> c AccountstatusesCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountstatusesCustomBatchRequestEntry #

toConstr :: AccountstatusesCustomBatchRequestEntry -> Constr #

dataTypeOf :: AccountstatusesCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountstatusesCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountstatusesCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> AccountstatusesCustomBatchRequestEntry -> AccountstatusesCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountstatusesCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountstatusesCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountstatusesCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountstatusesCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchRequestEntry -> m AccountstatusesCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchRequestEntry -> m AccountstatusesCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchRequestEntry -> m AccountstatusesCustomBatchRequestEntry #

Show AccountstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON AccountstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesCustomBatchRequestEntry = D1 (MetaData "AccountstatusesCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountstatusesCustomBatchRequestEntry'" PrefixI True) ((S1 (MetaSel (Just "_acbrecMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_acbrecAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))) :*: (S1 (MetaSel (Just "_acbrecDestinations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_acbrecMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acbrecBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

accountstatusesCustomBatchRequestEntry :: AccountstatusesCustomBatchRequestEntry Source #

Creates a value of AccountstatusesCustomBatchRequestEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acbrecAccountId :: Lens' AccountstatusesCustomBatchRequestEntry (Maybe Word64) Source #

The ID of the (sub-)account whose status to get.

acbrecDestinations :: Lens' AccountstatusesCustomBatchRequestEntry [Text] Source #

If set, only issues for the specified destinations are returned, otherwise only issues for the Shopping destination.

acbrecBatchId :: Lens' AccountstatusesCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

DeliveryTime

data DeliveryTime Source #

Instances
Eq DeliveryTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DeliveryTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeliveryTime -> c DeliveryTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeliveryTime #

toConstr :: DeliveryTime -> Constr #

dataTypeOf :: DeliveryTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeliveryTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeliveryTime) #

gmapT :: (forall b. Data b => b -> b) -> DeliveryTime -> DeliveryTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeliveryTime -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeliveryTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeliveryTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeliveryTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeliveryTime -> m DeliveryTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeliveryTime -> m DeliveryTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeliveryTime -> m DeliveryTime #

Show DeliveryTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DeliveryTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DeliveryTime :: Type -> Type #

ToJSON DeliveryTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DeliveryTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DeliveryTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DeliveryTime = D1 (MetaData "DeliveryTime" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DeliveryTime'" PrefixI True) ((S1 (MetaSel (Just "_dtHolidayCutoffs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [HolidayCutoff])) :*: (S1 (MetaSel (Just "_dtMinTransitTimeInDays") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_dtCutoffTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CutoffTime)))) :*: (S1 (MetaSel (Just "_dtMinHandlingTimeInDays") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: (S1 (MetaSel (Just "_dtMaxTransitTimeInDays") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_dtMaxHandlingTimeInDays") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

deliveryTime :: DeliveryTime Source #

Creates a value of DeliveryTime with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dtHolidayCutoffs :: Lens' DeliveryTime [HolidayCutoff] Source #

Holiday cutoff definitions. If configured, they specify order cutoff times for holiday-specific shipping.

dtMinTransitTimeInDays :: Lens' DeliveryTime (Maybe Word32) Source #

Minimum number of business days that is spent in transit. 0 means same day delivery, 1 means next day delivery. Required.

dtCutoffTime :: Lens' DeliveryTime (Maybe CutoffTime) Source #

Business days cutoff time definition. If not configured the cutoff time will be defaulted to 8AM PST.

dtMinHandlingTimeInDays :: Lens' DeliveryTime (Maybe Word32) Source #

Minimum number of business days spent before an order is shipped. 0 means same day shipped, 1 means next day shipped.

dtMaxTransitTimeInDays :: Lens' DeliveryTime (Maybe Word32) Source #

Maximum number of business days that is spent in transit. 0 means same day delivery, 1 means next day delivery. Must be greater than or equal to minTransitTimeInDays. Required.

dtMaxHandlingTimeInDays :: Lens' DeliveryTime (Maybe Word32) Source #

Maximum number of business days spent before an order is shipped. 0 means same day shipped, 1 means next day shipped. Must be greater than or equal to minHandlingTimeInDays.

LiaCountrySettings

data LiaCountrySettings Source #

Instances
Eq LiaCountrySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaCountrySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaCountrySettings -> c LiaCountrySettings #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaCountrySettings #

toConstr :: LiaCountrySettings -> Constr #

dataTypeOf :: LiaCountrySettings -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaCountrySettings) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaCountrySettings) #

gmapT :: (forall b. Data b => b -> b) -> LiaCountrySettings -> LiaCountrySettings #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaCountrySettings -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaCountrySettings -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaCountrySettings -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaCountrySettings -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaCountrySettings -> m LiaCountrySettings #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaCountrySettings -> m LiaCountrySettings #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaCountrySettings -> m LiaCountrySettings #

Show LiaCountrySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaCountrySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaCountrySettings :: Type -> Type #

ToJSON LiaCountrySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaCountrySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaCountrySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaCountrySettings = D1 (MetaData "LiaCountrySettings" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaCountrySettings'" PrefixI True) ((S1 (MetaSel (Just "_lcsPosDataProvider") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LiaPosDataProvider)) :*: (S1 (MetaSel (Just "_lcsCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lcsStorePickupActive") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: ((S1 (MetaSel (Just "_lcsInventory") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LiaInventorySettings)) :*: S1 (MetaSel (Just "_lcsAbout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LiaAboutPageSettings))) :*: (S1 (MetaSel (Just "_lcsHostedLocalStorefrontActive") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_lcsOnDisplayToOrder") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LiaOnDisplayToOrderSettings))))))

liaCountrySettings :: LiaCountrySettings Source #

Creates a value of LiaCountrySettings with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lcsPosDataProvider :: Lens' LiaCountrySettings (Maybe LiaPosDataProvider) Source #

The POS data provider linked with this country.

lcsCountry :: Lens' LiaCountrySettings (Maybe Text) Source #

CLDR country code (e.g. "US").

lcsStorePickupActive :: Lens' LiaCountrySettings (Maybe Bool) Source #

The status of the "Store pickup" feature.

lcsInventory :: Lens' LiaCountrySettings (Maybe LiaInventorySettings) Source #

LIA inventory verification settings.

lcsAbout :: Lens' LiaCountrySettings (Maybe LiaAboutPageSettings) Source #

The settings for the About page.

lcsHostedLocalStorefrontActive :: Lens' LiaCountrySettings (Maybe Bool) Source #

The status of the "Merchant hosted local storefront" feature.

OrdersReturnRefundLineItemResponse

data OrdersReturnRefundLineItemResponse Source #

Instances
Eq OrdersReturnRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersReturnRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersReturnRefundLineItemResponse -> c OrdersReturnRefundLineItemResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersReturnRefundLineItemResponse #

toConstr :: OrdersReturnRefundLineItemResponse -> Constr #

dataTypeOf :: OrdersReturnRefundLineItemResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersReturnRefundLineItemResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersReturnRefundLineItemResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersReturnRefundLineItemResponse -> OrdersReturnRefundLineItemResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersReturnRefundLineItemResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersReturnRefundLineItemResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersReturnRefundLineItemResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersReturnRefundLineItemResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersReturnRefundLineItemResponse -> m OrdersReturnRefundLineItemResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersReturnRefundLineItemResponse -> m OrdersReturnRefundLineItemResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersReturnRefundLineItemResponse -> m OrdersReturnRefundLineItemResponse #

Show OrdersReturnRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersReturnRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersReturnRefundLineItemResponse :: Type -> Type #

ToJSON OrdersReturnRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersReturnRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersReturnRefundLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersReturnRefundLineItemResponse = D1 (MetaData "OrdersReturnRefundLineItemResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersReturnRefundLineItemResponse'" PrefixI True) (S1 (MetaSel (Just "_orrlirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_orrlirExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersReturnRefundLineItemResponse :: OrdersReturnRefundLineItemResponse Source #

Creates a value of OrdersReturnRefundLineItemResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

orrlirKind :: Lens' OrdersReturnRefundLineItemResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersReturnRefundLineItemResponse".

ProductstatusesCustomBatchResponseEntry

data ProductstatusesCustomBatchResponseEntry Source #

A batch entry encoding a single non-batch productstatuses response.

See: productstatusesCustomBatchResponseEntry smart constructor.

Instances
Eq ProductstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductstatusesCustomBatchResponseEntry -> c ProductstatusesCustomBatchResponseEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductstatusesCustomBatchResponseEntry #

toConstr :: ProductstatusesCustomBatchResponseEntry -> Constr #

dataTypeOf :: ProductstatusesCustomBatchResponseEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductstatusesCustomBatchResponseEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductstatusesCustomBatchResponseEntry) #

gmapT :: (forall b. Data b => b -> b) -> ProductstatusesCustomBatchResponseEntry -> ProductstatusesCustomBatchResponseEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductstatusesCustomBatchResponseEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductstatusesCustomBatchResponseEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductstatusesCustomBatchResponseEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductstatusesCustomBatchResponseEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchResponseEntry -> m ProductstatusesCustomBatchResponseEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchResponseEntry -> m ProductstatusesCustomBatchResponseEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchResponseEntry -> m ProductstatusesCustomBatchResponseEntry #

Show ProductstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON ProductstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesCustomBatchResponseEntry = D1 (MetaData "ProductstatusesCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductstatusesCustomBatchResponseEntry'" PrefixI True) ((S1 (MetaSel (Just "_pKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_pProductStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ProductStatus))) :*: (S1 (MetaSel (Just "_pErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: S1 (MetaSel (Just "_pBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

productstatusesCustomBatchResponseEntry :: ProductstatusesCustomBatchResponseEntry Source #

Creates a value of ProductstatusesCustomBatchResponseEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pKind :: Lens' ProductstatusesCustomBatchResponseEntry Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#productstatusesCustomBatchResponseEntry".

pProductStatus :: Lens' ProductstatusesCustomBatchResponseEntry (Maybe ProductStatus) Source #

The requested product status. Only defined if the request was successful.

pErrors :: Lens' ProductstatusesCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors, if the request failed.

pBatchId :: Lens' ProductstatusesCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry this entry responds to.

ShippingSettingsGetSupportedHolidaysResponse

data ShippingSettingsGetSupportedHolidaysResponse Source #

Instances
Eq ShippingSettingsGetSupportedHolidaysResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShippingSettingsGetSupportedHolidaysResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShippingSettingsGetSupportedHolidaysResponse -> c ShippingSettingsGetSupportedHolidaysResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShippingSettingsGetSupportedHolidaysResponse #

toConstr :: ShippingSettingsGetSupportedHolidaysResponse -> Constr #

dataTypeOf :: ShippingSettingsGetSupportedHolidaysResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShippingSettingsGetSupportedHolidaysResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShippingSettingsGetSupportedHolidaysResponse) #

gmapT :: (forall b. Data b => b -> b) -> ShippingSettingsGetSupportedHolidaysResponse -> ShippingSettingsGetSupportedHolidaysResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsGetSupportedHolidaysResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsGetSupportedHolidaysResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShippingSettingsGetSupportedHolidaysResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShippingSettingsGetSupportedHolidaysResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShippingSettingsGetSupportedHolidaysResponse -> m ShippingSettingsGetSupportedHolidaysResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsGetSupportedHolidaysResponse -> m ShippingSettingsGetSupportedHolidaysResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsGetSupportedHolidaysResponse -> m ShippingSettingsGetSupportedHolidaysResponse #

Show ShippingSettingsGetSupportedHolidaysResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShippingSettingsGetSupportedHolidaysResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON ShippingSettingsGetSupportedHolidaysResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShippingSettingsGetSupportedHolidaysResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsGetSupportedHolidaysResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsGetSupportedHolidaysResponse = D1 (MetaData "ShippingSettingsGetSupportedHolidaysResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShippingSettingsGetSupportedHolidaysResponse'" PrefixI True) (S1 (MetaSel (Just "_ssgshrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ssgshrHolidays") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [HolidaysHoliday]))))

shippingSettingsGetSupportedHolidaysResponse :: ShippingSettingsGetSupportedHolidaysResponse Source #

Creates a value of ShippingSettingsGetSupportedHolidaysResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ssgshrKind :: Lens' ShippingSettingsGetSupportedHolidaysResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#shippingsettingsGetSupportedHolidaysResponse".

ssgshrHolidays :: Lens' ShippingSettingsGetSupportedHolidaysResponse [HolidaysHoliday] Source #

A list of holidays applicable for delivery guarantees. May be empty.

LiaPosDataProvider

data LiaPosDataProvider Source #

Instances
Eq LiaPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaPosDataProvider -> c LiaPosDataProvider #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaPosDataProvider #

toConstr :: LiaPosDataProvider -> Constr #

dataTypeOf :: LiaPosDataProvider -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaPosDataProvider) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaPosDataProvider) #

gmapT :: (forall b. Data b => b -> b) -> LiaPosDataProvider -> LiaPosDataProvider #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaPosDataProvider -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaPosDataProvider -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaPosDataProvider -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaPosDataProvider -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaPosDataProvider -> m LiaPosDataProvider #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaPosDataProvider -> m LiaPosDataProvider #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaPosDataProvider -> m LiaPosDataProvider #

Show LiaPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaPosDataProvider :: Type -> Type #

ToJSON LiaPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaPosDataProvider Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaPosDataProvider = D1 (MetaData "LiaPosDataProvider" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaPosDataProvider'" PrefixI True) (S1 (MetaSel (Just "_lpdpPosExternalAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lpdpPosDataProviderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))))

liaPosDataProvider :: LiaPosDataProvider Source #

Creates a value of LiaPosDataProvider with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lpdpPosExternalAccountId :: Lens' LiaPosDataProvider (Maybe Text) Source #

The account ID by which this merchant is known to the POS data provider.

lpdpPosDataProviderId :: Lens' LiaPosDataProvider (Maybe Word64) Source #

The ID of the POS data provider.

DatafeedFormat

data DatafeedFormat Source #

Instances
Eq DatafeedFormat Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedFormat Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedFormat -> c DatafeedFormat #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedFormat #

toConstr :: DatafeedFormat -> Constr #

dataTypeOf :: DatafeedFormat -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedFormat) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedFormat) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedFormat -> DatafeedFormat #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedFormat -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedFormat -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedFormat -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedFormat -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedFormat -> m DatafeedFormat #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedFormat -> m DatafeedFormat #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedFormat -> m DatafeedFormat #

Show DatafeedFormat Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedFormat Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedFormat :: Type -> Type #

ToJSON DatafeedFormat Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedFormat Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedFormat Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedFormat = D1 (MetaData "DatafeedFormat" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedFormat'" PrefixI True) (S1 (MetaSel (Just "_dfQuotingMode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dfFileEncoding") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dfColumnDelimiter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

datafeedFormat :: DatafeedFormat Source #

Creates a value of DatafeedFormat with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dfQuotingMode :: Lens' DatafeedFormat (Maybe Text) Source #

Specifies how double quotes are interpreted. If not specified, the mode will be auto-detected. Ignored for non-DSV data feeds.

dfFileEncoding :: Lens' DatafeedFormat (Maybe Text) Source #

Character encoding scheme of the data feed. If not specified, the encoding will be auto-detected.

dfColumnDelimiter :: Lens' DatafeedFormat (Maybe Text) Source #

Delimiter for the separation of values in a delimiter-separated values feed. If not specified, the delimiter will be auto-detected. Ignored for non-DSV data feeds.

LiaSettings

data LiaSettings Source #

Local Inventory ads (LIA) settings. All methods except listposdataproviders require the admin role.

See: liaSettings smart constructor.

Instances
Eq LiaSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettings -> c LiaSettings #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettings #

toConstr :: LiaSettings -> Constr #

dataTypeOf :: LiaSettings -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettings) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettings) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettings -> LiaSettings #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettings -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettings -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettings -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettings -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettings -> m LiaSettings #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettings -> m LiaSettings #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettings -> m LiaSettings #

Show LiaSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaSettings :: Type -> Type #

ToJSON LiaSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettings = D1 (MetaData "LiaSettings" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaSettings'" PrefixI True) (S1 (MetaSel (Just "_lsCountrySettings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [LiaCountrySettings])) :*: (S1 (MetaSel (Just "_lsKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_lsAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))))))

liaSettings :: LiaSettings Source #

Creates a value of LiaSettings with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lsCountrySettings :: Lens' LiaSettings [LiaCountrySettings] Source #

The LIA settings for each country.

lsKind :: Lens' LiaSettings Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liaSettings".

lsAccountId :: Lens' LiaSettings (Maybe Word64) Source #

The ID of the account to which these LIA settings belong. Ignored upon update, always present in get request responses.

ProductShipping

data ProductShipping Source #

Instances
Eq ProductShipping Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductShipping Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductShipping -> c ProductShipping #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductShipping #

toConstr :: ProductShipping -> Constr #

dataTypeOf :: ProductShipping -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductShipping) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductShipping) #

gmapT :: (forall b. Data b => b -> b) -> ProductShipping -> ProductShipping #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductShipping -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductShipping -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductShipping -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductShipping -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductShipping -> m ProductShipping #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductShipping -> m ProductShipping #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductShipping -> m ProductShipping #

Show ProductShipping Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductShipping Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductShipping :: Type -> Type #

ToJSON ProductShipping Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductShipping Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductShipping Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductShipping = D1 (MetaData "ProductShipping" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductShipping'" PrefixI True) ((S1 (MetaSel (Just "_pService") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_pLocationGroupName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_pPostalCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pPrice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))) :*: (S1 (MetaSel (Just "_pRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pLocationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))))

productShipping :: ProductShipping Source #

Creates a value of ProductShipping with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pService :: Lens' ProductShipping (Maybe Text) Source #

A free-form description of the service class or delivery speed.

pLocationGroupName :: Lens' ProductShipping (Maybe Text) Source #

The location where the shipping is applicable, represented by a location group name.

pCountry :: Lens' ProductShipping (Maybe Text) Source #

The CLDR territory code of the country to which an item will ship.

pPostalCode :: Lens' ProductShipping (Maybe Text) Source #

The postal code range that the shipping rate applies to, represented by a postal code, a postal code prefix followed by a * wildcard, a range between two postal codes or two postal code prefixes of equal length.

pPrice :: Lens' ProductShipping (Maybe Price) Source #

Fixed shipping price, represented as a number.

pRegion :: Lens' ProductShipping (Maybe Text) Source #

The geographic region to which a shipping rate applies.

pLocationId :: Lens' ProductShipping (Maybe Int64) Source #

The numeric id of a location that the shipping rate applies to as defined in the AdWords API.

ShippingSettingsCustomBatchRequest

data ShippingSettingsCustomBatchRequest Source #

Instances
Eq ShippingSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShippingSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShippingSettingsCustomBatchRequest -> c ShippingSettingsCustomBatchRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShippingSettingsCustomBatchRequest #

toConstr :: ShippingSettingsCustomBatchRequest -> Constr #

dataTypeOf :: ShippingSettingsCustomBatchRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShippingSettingsCustomBatchRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShippingSettingsCustomBatchRequest) #

gmapT :: (forall b. Data b => b -> b) -> ShippingSettingsCustomBatchRequest -> ShippingSettingsCustomBatchRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsCustomBatchRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsCustomBatchRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShippingSettingsCustomBatchRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShippingSettingsCustomBatchRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchRequest -> m ShippingSettingsCustomBatchRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchRequest -> m ShippingSettingsCustomBatchRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchRequest -> m ShippingSettingsCustomBatchRequest #

Show ShippingSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShippingSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ShippingSettingsCustomBatchRequest :: Type -> Type #

ToJSON ShippingSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShippingSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsCustomBatchRequest = D1 (MetaData "ShippingSettingsCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "ShippingSettingsCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_sscbrEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [ShippingSettingsCustomBatchRequestEntry]))))

shippingSettingsCustomBatchRequest :: ShippingSettingsCustomBatchRequest Source #

Creates a value of ShippingSettingsCustomBatchRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

LiaSettingsCustomBatchResponseEntry

data LiaSettingsCustomBatchResponseEntry Source #

Instances
Eq LiaSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettingsCustomBatchResponseEntry -> c LiaSettingsCustomBatchResponseEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettingsCustomBatchResponseEntry #

toConstr :: LiaSettingsCustomBatchResponseEntry -> Constr #

dataTypeOf :: LiaSettingsCustomBatchResponseEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettingsCustomBatchResponseEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettingsCustomBatchResponseEntry) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettingsCustomBatchResponseEntry -> LiaSettingsCustomBatchResponseEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsCustomBatchResponseEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsCustomBatchResponseEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettingsCustomBatchResponseEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettingsCustomBatchResponseEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchResponseEntry -> m LiaSettingsCustomBatchResponseEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchResponseEntry -> m LiaSettingsCustomBatchResponseEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchResponseEntry -> m LiaSettingsCustomBatchResponseEntry #

Show LiaSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON LiaSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsCustomBatchResponseEntry = D1 (MetaData "LiaSettingsCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaSettingsCustomBatchResponseEntry'" PrefixI True) ((S1 (MetaSel (Just "_lscbreGmbAccounts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GmbAccounts)) :*: (S1 (MetaSel (Just "_lscbreKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_lscbreLiaSettings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LiaSettings)))) :*: (S1 (MetaSel (Just "_lscbreErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: (S1 (MetaSel (Just "_lscbrePosDataProviders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PosDataProviders])) :*: S1 (MetaSel (Just "_lscbreBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

liaSettingsCustomBatchResponseEntry :: LiaSettingsCustomBatchResponseEntry Source #

Creates a value of LiaSettingsCustomBatchResponseEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lscbreKind :: Lens' LiaSettingsCustomBatchResponseEntry Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsCustomBatchResponseEntry".

lscbreErrors :: Lens' LiaSettingsCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if, and only if, the request failed.

lscbreBatchId :: Lens' LiaSettingsCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry to which this entry responds.

AccountsCustomBatchRequest

data AccountsCustomBatchRequest Source #

Instances
Eq AccountsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountsCustomBatchRequest -> c AccountsCustomBatchRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountsCustomBatchRequest #

toConstr :: AccountsCustomBatchRequest -> Constr #

dataTypeOf :: AccountsCustomBatchRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountsCustomBatchRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountsCustomBatchRequest) #

gmapT :: (forall b. Data b => b -> b) -> AccountsCustomBatchRequest -> AccountsCustomBatchRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountsCustomBatchRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountsCustomBatchRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountsCustomBatchRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountsCustomBatchRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequest -> m AccountsCustomBatchRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequest -> m AccountsCustomBatchRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequest -> m AccountsCustomBatchRequest #

Show AccountsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsCustomBatchRequest :: Type -> Type #

ToJSON AccountsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchRequest = D1 (MetaData "AccountsCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "AccountsCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_aEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [AccountsCustomBatchRequestEntry]))))

accountsCustomBatchRequest :: AccountsCustomBatchRequest Source #

Creates a value of AccountsCustomBatchRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aEntries :: Lens' AccountsCustomBatchRequest [AccountsCustomBatchRequestEntry] Source #

The request entries to be processed in the batch.

PosCustomBatchResponseEntry

data PosCustomBatchResponseEntry Source #

Instances
Eq PosCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosCustomBatchResponseEntry -> c PosCustomBatchResponseEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosCustomBatchResponseEntry #

toConstr :: PosCustomBatchResponseEntry -> Constr #

dataTypeOf :: PosCustomBatchResponseEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosCustomBatchResponseEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosCustomBatchResponseEntry) #

gmapT :: (forall b. Data b => b -> b) -> PosCustomBatchResponseEntry -> PosCustomBatchResponseEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosCustomBatchResponseEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosCustomBatchResponseEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosCustomBatchResponseEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosCustomBatchResponseEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosCustomBatchResponseEntry -> m PosCustomBatchResponseEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosCustomBatchResponseEntry -> m PosCustomBatchResponseEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosCustomBatchResponseEntry -> m PosCustomBatchResponseEntry #

Show PosCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosCustomBatchResponseEntry :: Type -> Type #

ToJSON PosCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosCustomBatchResponseEntry = D1 (MetaData "PosCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosCustomBatchResponseEntry'" PrefixI True) ((S1 (MetaSel (Just "_pcbrecKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_pcbrecStore") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PosStore)) :*: S1 (MetaSel (Just "_pcbrecInventory") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PosInventory)))) :*: (S1 (MetaSel (Just "_pcbrecErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: (S1 (MetaSel (Just "_pcbrecSale") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PosSale)) :*: S1 (MetaSel (Just "_pcbrecBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

posCustomBatchResponseEntry :: PosCustomBatchResponseEntry Source #

Creates a value of PosCustomBatchResponseEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pcbrecKind :: Lens' PosCustomBatchResponseEntry Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#posCustomBatchResponseEntry".

pcbrecStore :: Lens' PosCustomBatchResponseEntry (Maybe PosStore) Source #

The retrieved or updated store information.

pcbrecErrors :: Lens' PosCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if, and only if, the request failed.

pcbrecBatchId :: Lens' PosCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry to which this entry responds.

OrderpaymentsNotifyAuthApprovedResponse

data OrderpaymentsNotifyAuthApprovedResponse Source #

Instances
Eq OrderpaymentsNotifyAuthApprovedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderpaymentsNotifyAuthApprovedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderpaymentsNotifyAuthApprovedResponse -> c OrderpaymentsNotifyAuthApprovedResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderpaymentsNotifyAuthApprovedResponse #

toConstr :: OrderpaymentsNotifyAuthApprovedResponse -> Constr #

dataTypeOf :: OrderpaymentsNotifyAuthApprovedResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderpaymentsNotifyAuthApprovedResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderpaymentsNotifyAuthApprovedResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrderpaymentsNotifyAuthApprovedResponse -> OrderpaymentsNotifyAuthApprovedResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyAuthApprovedResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyAuthApprovedResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderpaymentsNotifyAuthApprovedResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderpaymentsNotifyAuthApprovedResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthApprovedResponse -> m OrderpaymentsNotifyAuthApprovedResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthApprovedResponse -> m OrderpaymentsNotifyAuthApprovedResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthApprovedResponse -> m OrderpaymentsNotifyAuthApprovedResponse #

Show OrderpaymentsNotifyAuthApprovedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderpaymentsNotifyAuthApprovedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderpaymentsNotifyAuthApprovedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderpaymentsNotifyAuthApprovedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyAuthApprovedResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyAuthApprovedResponse = D1 (MetaData "OrderpaymentsNotifyAuthApprovedResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderpaymentsNotifyAuthApprovedResponse'" PrefixI True) (S1 (MetaSel (Just "_onaarKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_onaarExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderpaymentsNotifyAuthApprovedResponse :: OrderpaymentsNotifyAuthApprovedResponse Source #

Creates a value of OrderpaymentsNotifyAuthApprovedResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

onaarKind :: Lens' OrderpaymentsNotifyAuthApprovedResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderpaymentsNotifyAuthApprovedResponse".

OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption

data OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption Source #

Instances
Eq OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> c OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption #

toConstr :: OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> Constr #

dataTypeOf :: OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption) #

gmapT :: (forall b. Data b => b -> b) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> m OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> m OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption -> m OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption #

Show OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption = D1 (MetaData "OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption'" PrefixI True) (S1 (MetaSel (Just "_oReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

OrdersListResponse

data OrdersListResponse Source #

Instances
Eq OrdersListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersListResponse -> c OrdersListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersListResponse #

toConstr :: OrdersListResponse -> Constr #

dataTypeOf :: OrdersListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersListResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersListResponse -> OrdersListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersListResponse -> m OrdersListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersListResponse -> m OrdersListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersListResponse -> m OrdersListResponse #

Show OrdersListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersListResponse :: Type -> Type #

ToJSON OrdersListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersListResponse = D1 (MetaData "OrdersListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersListResponse'" PrefixI True) (S1 (MetaSel (Just "_oNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Order])))))

ordersListResponse :: OrdersListResponse Source #

Creates a value of OrdersListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oNextPageToken :: Lens' OrdersListResponse (Maybe Text) Source #

The token for the retrieval of the next page of orders.

oKind :: Lens' OrdersListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersListResponse".

OrdersUpdateLineItemShippingDetailsResponse

data OrdersUpdateLineItemShippingDetailsResponse Source #

Instances
Eq OrdersUpdateLineItemShippingDetailsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersUpdateLineItemShippingDetailsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersUpdateLineItemShippingDetailsResponse -> c OrdersUpdateLineItemShippingDetailsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersUpdateLineItemShippingDetailsResponse #

toConstr :: OrdersUpdateLineItemShippingDetailsResponse -> Constr #

dataTypeOf :: OrdersUpdateLineItemShippingDetailsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersUpdateLineItemShippingDetailsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersUpdateLineItemShippingDetailsResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersUpdateLineItemShippingDetailsResponse -> OrdersUpdateLineItemShippingDetailsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersUpdateLineItemShippingDetailsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersUpdateLineItemShippingDetailsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersUpdateLineItemShippingDetailsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersUpdateLineItemShippingDetailsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersUpdateLineItemShippingDetailsResponse -> m OrdersUpdateLineItemShippingDetailsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersUpdateLineItemShippingDetailsResponse -> m OrdersUpdateLineItemShippingDetailsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersUpdateLineItemShippingDetailsResponse -> m OrdersUpdateLineItemShippingDetailsResponse #

Show OrdersUpdateLineItemShippingDetailsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersUpdateLineItemShippingDetailsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrdersUpdateLineItemShippingDetailsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersUpdateLineItemShippingDetailsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateLineItemShippingDetailsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateLineItemShippingDetailsResponse = D1 (MetaData "OrdersUpdateLineItemShippingDetailsResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersUpdateLineItemShippingDetailsResponse'" PrefixI True) (S1 (MetaSel (Just "_oulisdrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oulisdrExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersUpdateLineItemShippingDetailsResponse :: OrdersUpdateLineItemShippingDetailsResponse Source #

Creates a value of OrdersUpdateLineItemShippingDetailsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oulisdrKind :: Lens' OrdersUpdateLineItemShippingDetailsResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersUpdateLineItemShippingDetailsResponse".

Headers

data Headers Source #

A non-empty list of row or column headers for a table. Exactly one of prices, weights, numItems, postalCodeGroupNames, or locations must be set.

See: headers smart constructor.

Instances
Eq Headers Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Headers -> Headers -> Bool #

(/=) :: Headers -> Headers -> Bool #

Data Headers Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Headers -> c Headers #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Headers #

toConstr :: Headers -> Constr #

dataTypeOf :: Headers -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Headers) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Headers) #

gmapT :: (forall b. Data b => b -> b) -> Headers -> Headers #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Headers -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Headers -> r #

gmapQ :: (forall d. Data d => d -> u) -> Headers -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Headers -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Headers -> m Headers #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Headers -> m Headers #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Headers -> m Headers #

Show Headers Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Headers Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Headers :: Type -> Type #

Methods

from :: Headers -> Rep Headers x #

to :: Rep Headers x -> Headers #

ToJSON Headers Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Headers Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Headers Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Headers = D1 (MetaData "Headers" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Headers'" PrefixI True) ((S1 (MetaSel (Just "_hNumberOfItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_hPostalCodeGroupNames") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_hPrices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Price])) :*: (S1 (MetaSel (Just "_hWeights") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Weight])) :*: S1 (MetaSel (Just "_hLocations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [LocationIdSet]))))))

headers :: Headers Source #

Creates a value of Headers with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

hNumberOfItems :: Lens' Headers [Text] Source #

A list of inclusive number of items upper bounds. The last value can be "infinity". For example ["10", "50", "infinity"] represents the headers "<= 10 items", " 50 items". Must be non-empty. Can only be set if all other fields are not set.

hPostalCodeGroupNames :: Lens' Headers [Text] Source #

A list of postal group names. The last value can be "all other locations". Example: ["zone 1", "zone 2", "all other locations"]. The referred postal code groups must match the delivery country of the service. Must be non-empty. Can only be set if all other fields are not set.

hWeights :: Lens' Headers [Weight] Source #

A list of inclusive order weight upper bounds. The last weight's value can be "infinity". For example [{"value": "10", "unit": "kg"}, {"value": "50", "unit": "kg"}, {"value": "infinity", "unit": "kg"}] represents the headers "<= 10kg", " 50kg". All weights within a service must have the same unit. Must be non-empty. Can only be set if all other fields are not set.

hLocations :: Lens' Headers [LocationIdSet] Source #

A list of location ID sets. Must be non-empty. Can only be set if all other fields are not set.

UnitInvoiceAdditionalCharge

data UnitInvoiceAdditionalCharge Source #

Instances
Eq UnitInvoiceAdditionalCharge Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data UnitInvoiceAdditionalCharge Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnitInvoiceAdditionalCharge -> c UnitInvoiceAdditionalCharge #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnitInvoiceAdditionalCharge #

toConstr :: UnitInvoiceAdditionalCharge -> Constr #

dataTypeOf :: UnitInvoiceAdditionalCharge -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnitInvoiceAdditionalCharge) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnitInvoiceAdditionalCharge) #

gmapT :: (forall b. Data b => b -> b) -> UnitInvoiceAdditionalCharge -> UnitInvoiceAdditionalCharge #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnitInvoiceAdditionalCharge -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnitInvoiceAdditionalCharge -> r #

gmapQ :: (forall d. Data d => d -> u) -> UnitInvoiceAdditionalCharge -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnitInvoiceAdditionalCharge -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnitInvoiceAdditionalCharge -> m UnitInvoiceAdditionalCharge #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitInvoiceAdditionalCharge -> m UnitInvoiceAdditionalCharge #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitInvoiceAdditionalCharge -> m UnitInvoiceAdditionalCharge #

Show UnitInvoiceAdditionalCharge Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic UnitInvoiceAdditionalCharge Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep UnitInvoiceAdditionalCharge :: Type -> Type #

ToJSON UnitInvoiceAdditionalCharge Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON UnitInvoiceAdditionalCharge Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep UnitInvoiceAdditionalCharge Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep UnitInvoiceAdditionalCharge = D1 (MetaData "UnitInvoiceAdditionalCharge" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "UnitInvoiceAdditionalCharge'" PrefixI True) (S1 (MetaSel (Just "_uiacAdditionalChargePromotions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Promotion])) :*: (S1 (MetaSel (Just "_uiacAdditionalChargeAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Amount)) :*: S1 (MetaSel (Just "_uiacType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

unitInvoiceAdditionalCharge :: UnitInvoiceAdditionalCharge Source #

Creates a value of UnitInvoiceAdditionalCharge with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uiacAdditionalChargePromotions :: Lens' UnitInvoiceAdditionalCharge [Promotion] Source #

Promotions applied to the additional charge.

uiacAdditionalChargeAmount :: Lens' UnitInvoiceAdditionalCharge (Maybe Amount) Source #

required
Amount of the additional charge.

uiacType :: Lens' UnitInvoiceAdditionalCharge (Maybe Text) Source #

required
Type of the additional charge.

OrdersShipLineItemsResponse

data OrdersShipLineItemsResponse Source #

Instances
Eq OrdersShipLineItemsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersShipLineItemsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersShipLineItemsResponse -> c OrdersShipLineItemsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersShipLineItemsResponse #

toConstr :: OrdersShipLineItemsResponse -> Constr #

dataTypeOf :: OrdersShipLineItemsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersShipLineItemsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersShipLineItemsResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersShipLineItemsResponse -> OrdersShipLineItemsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersShipLineItemsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersShipLineItemsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersShipLineItemsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersShipLineItemsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersShipLineItemsResponse -> m OrdersShipLineItemsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersShipLineItemsResponse -> m OrdersShipLineItemsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersShipLineItemsResponse -> m OrdersShipLineItemsResponse #

Show OrdersShipLineItemsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersShipLineItemsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersShipLineItemsResponse :: Type -> Type #

ToJSON OrdersShipLineItemsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersShipLineItemsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersShipLineItemsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersShipLineItemsResponse = D1 (MetaData "OrdersShipLineItemsResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersShipLineItemsResponse'" PrefixI True) (S1 (MetaSel (Just "_oslirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oslirExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersShipLineItemsResponse :: OrdersShipLineItemsResponse Source #

Creates a value of OrdersShipLineItemsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oslirKind :: Lens' OrdersShipLineItemsResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersShipLineItemsResponse".

UnitInvoiceTaxLine

data UnitInvoiceTaxLine Source #

Instances
Eq UnitInvoiceTaxLine Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data UnitInvoiceTaxLine Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnitInvoiceTaxLine -> c UnitInvoiceTaxLine #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnitInvoiceTaxLine #

toConstr :: UnitInvoiceTaxLine -> Constr #

dataTypeOf :: UnitInvoiceTaxLine -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnitInvoiceTaxLine) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnitInvoiceTaxLine) #

gmapT :: (forall b. Data b => b -> b) -> UnitInvoiceTaxLine -> UnitInvoiceTaxLine #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnitInvoiceTaxLine -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnitInvoiceTaxLine -> r #

gmapQ :: (forall d. Data d => d -> u) -> UnitInvoiceTaxLine -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnitInvoiceTaxLine -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnitInvoiceTaxLine -> m UnitInvoiceTaxLine #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitInvoiceTaxLine -> m UnitInvoiceTaxLine #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitInvoiceTaxLine -> m UnitInvoiceTaxLine #

Show UnitInvoiceTaxLine Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic UnitInvoiceTaxLine Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep UnitInvoiceTaxLine :: Type -> Type #

ToJSON UnitInvoiceTaxLine Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON UnitInvoiceTaxLine Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep UnitInvoiceTaxLine Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep UnitInvoiceTaxLine = D1 (MetaData "UnitInvoiceTaxLine" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "UnitInvoiceTaxLine'" PrefixI True) (S1 (MetaSel (Just "_uitlTaxName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_uitlTaxType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_uitlTaxAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)))))

unitInvoiceTaxLine :: UnitInvoiceTaxLine Source #

Creates a value of UnitInvoiceTaxLine with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uitlTaxName :: Lens' UnitInvoiceTaxLine (Maybe Text) Source #

Optional name of the tax type. This should only be provided if taxType is otherFeeTax.

uitlTaxType :: Lens' UnitInvoiceTaxLine (Maybe Text) Source #

required
Type of the tax.

uitlTaxAmount :: Lens' UnitInvoiceTaxLine (Maybe Price) Source #

required
Tax amount for the tax type.

OrdersCreateTestReturnRequest

data OrdersCreateTestReturnRequest Source #

Instances
Eq OrdersCreateTestReturnRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCreateTestReturnRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCreateTestReturnRequest -> c OrdersCreateTestReturnRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCreateTestReturnRequest #

toConstr :: OrdersCreateTestReturnRequest -> Constr #

dataTypeOf :: OrdersCreateTestReturnRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCreateTestReturnRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCreateTestReturnRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCreateTestReturnRequest -> OrdersCreateTestReturnRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCreateTestReturnRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCreateTestReturnRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCreateTestReturnRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCreateTestReturnRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCreateTestReturnRequest -> m OrdersCreateTestReturnRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCreateTestReturnRequest -> m OrdersCreateTestReturnRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCreateTestReturnRequest -> m OrdersCreateTestReturnRequest #

Show OrdersCreateTestReturnRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCreateTestReturnRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersCreateTestReturnRequest :: Type -> Type #

ToJSON OrdersCreateTestReturnRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCreateTestReturnRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCreateTestReturnRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCreateTestReturnRequest = D1 (MetaData "OrdersCreateTestReturnRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "OrdersCreateTestReturnRequest'" PrefixI True) (S1 (MetaSel (Just "_octrrItems") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [OrdersCustomBatchRequestEntryCreateTestReturnReturnItem]))))

ordersCreateTestReturnRequest :: OrdersCreateTestReturnRequest Source #

Creates a value of OrdersCreateTestReturnRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ShippingSettings

data ShippingSettings Source #

The merchant account's shipping settings. All methods except getsupportedcarriers and getsupportedholidays require the admin role.

See: shippingSettings smart constructor.

Instances
Eq ShippingSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShippingSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShippingSettings -> c ShippingSettings #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShippingSettings #

toConstr :: ShippingSettings -> Constr #

dataTypeOf :: ShippingSettings -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShippingSettings) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShippingSettings) #

gmapT :: (forall b. Data b => b -> b) -> ShippingSettings -> ShippingSettings #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettings -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettings -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShippingSettings -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShippingSettings -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShippingSettings -> m ShippingSettings #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettings -> m ShippingSettings #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettings -> m ShippingSettings #

Show ShippingSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShippingSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ShippingSettings :: Type -> Type #

ToJSON ShippingSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShippingSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettings = D1 (MetaData "ShippingSettings" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShippingSettings'" PrefixI True) (S1 (MetaSel (Just "_ssPostalCodeGroups") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PostalCodeGroup])) :*: (S1 (MetaSel (Just "_ssAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_ssServices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Service])))))

shippingSettings :: ShippingSettings Source #

Creates a value of ShippingSettings with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ssPostalCodeGroups :: Lens' ShippingSettings [PostalCodeGroup] Source #

A list of postal code groups that can be referred to in services. Optional.

ssAccountId :: Lens' ShippingSettings (Maybe Word64) Source #

The ID of the account to which these account shipping settings belong. Ignored upon update, always present in get request responses.

ssServices :: Lens' ShippingSettings [Service] Source #

The target account's list of services. Optional.

PostalCodeRange

data PostalCodeRange Source #

Instances
Eq PostalCodeRange Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PostalCodeRange Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PostalCodeRange -> c PostalCodeRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PostalCodeRange #

toConstr :: PostalCodeRange -> Constr #

dataTypeOf :: PostalCodeRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PostalCodeRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PostalCodeRange) #

gmapT :: (forall b. Data b => b -> b) -> PostalCodeRange -> PostalCodeRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PostalCodeRange -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PostalCodeRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> PostalCodeRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PostalCodeRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PostalCodeRange -> m PostalCodeRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PostalCodeRange -> m PostalCodeRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PostalCodeRange -> m PostalCodeRange #

Show PostalCodeRange Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PostalCodeRange Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PostalCodeRange :: Type -> Type #

ToJSON PostalCodeRange Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PostalCodeRange Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PostalCodeRange Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PostalCodeRange = D1 (MetaData "PostalCodeRange" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PostalCodeRange'" PrefixI True) (S1 (MetaSel (Just "_pcrPostalCodeRangeBegin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pcrPostalCodeRangeEnd") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

postalCodeRange :: PostalCodeRange Source #

Creates a value of PostalCodeRange with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pcrPostalCodeRangeBegin :: Lens' PostalCodeRange (Maybe Text) Source #

A postal code or a pattern of the form prefix* denoting the inclusive lower bound of the range defining the area. Examples values: "94108", "9410*", "9*". Required.

pcrPostalCodeRangeEnd :: Lens' PostalCodeRange (Maybe Text) Source #

A postal code or a pattern of the form prefix* denoting the inclusive upper bound of the range defining the area. It must have the same length as postalCodeRangeBegin: if postalCodeRangeBegin is a postal code then postalCodeRangeEnd must be a postal code too; if postalCodeRangeBegin is a pattern then postalCodeRangeEnd must be a pattern with the same prefix length. Optional: if not set, then the area is defined as being all the postal codes matching postalCodeRangeBegin.

OrdersUpdateShipmentResponse

data OrdersUpdateShipmentResponse Source #

Instances
Eq OrdersUpdateShipmentResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersUpdateShipmentResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersUpdateShipmentResponse -> c OrdersUpdateShipmentResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersUpdateShipmentResponse #

toConstr :: OrdersUpdateShipmentResponse -> Constr #

dataTypeOf :: OrdersUpdateShipmentResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersUpdateShipmentResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersUpdateShipmentResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersUpdateShipmentResponse -> OrdersUpdateShipmentResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersUpdateShipmentResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersUpdateShipmentResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersUpdateShipmentResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersUpdateShipmentResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersUpdateShipmentResponse -> m OrdersUpdateShipmentResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersUpdateShipmentResponse -> m OrdersUpdateShipmentResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersUpdateShipmentResponse -> m OrdersUpdateShipmentResponse #

Show OrdersUpdateShipmentResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersUpdateShipmentResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersUpdateShipmentResponse :: Type -> Type #

ToJSON OrdersUpdateShipmentResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersUpdateShipmentResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateShipmentResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateShipmentResponse = D1 (MetaData "OrdersUpdateShipmentResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersUpdateShipmentResponse'" PrefixI True) (S1 (MetaSel (Just "_ousrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ousrExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersUpdateShipmentResponse :: OrdersUpdateShipmentResponse Source #

Creates a value of OrdersUpdateShipmentResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ousrKind :: Lens' OrdersUpdateShipmentResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersUpdateShipmentResponse".

ProductstatusesCustomBatchRequest

data ProductstatusesCustomBatchRequest Source #

Instances
Eq ProductstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductstatusesCustomBatchRequest -> c ProductstatusesCustomBatchRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductstatusesCustomBatchRequest #

toConstr :: ProductstatusesCustomBatchRequest -> Constr #

dataTypeOf :: ProductstatusesCustomBatchRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductstatusesCustomBatchRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductstatusesCustomBatchRequest) #

gmapT :: (forall b. Data b => b -> b) -> ProductstatusesCustomBatchRequest -> ProductstatusesCustomBatchRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductstatusesCustomBatchRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductstatusesCustomBatchRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductstatusesCustomBatchRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductstatusesCustomBatchRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchRequest -> m ProductstatusesCustomBatchRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchRequest -> m ProductstatusesCustomBatchRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchRequest -> m ProductstatusesCustomBatchRequest #

Show ProductstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductstatusesCustomBatchRequest :: Type -> Type #

ToJSON ProductstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesCustomBatchRequest = D1 (MetaData "ProductstatusesCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "ProductstatusesCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_pcbrcEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [ProductstatusesCustomBatchRequestEntry]))))

productstatusesCustomBatchRequest :: ProductstatusesCustomBatchRequest Source #

Creates a value of ProductstatusesCustomBatchRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

AccountYouTubeChannelLink

data AccountYouTubeChannelLink Source #

accountYouTubeChannelLink :: AccountYouTubeChannelLink Source #

Creates a value of AccountYouTubeChannelLink with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aytclStatus :: Lens' AccountYouTubeChannelLink (Maybe Text) Source #

Status of the link between this Merchant Center account and the YouTube channel. Upon retrieval, it represents the actual status of the link and can be either active if it was approved in YT Creator Studio or pending if it's pending approval. Upon insertion, it represents the intended status of the link. Re-uploading a link with status active when it's still pending or with status pending when it's already active will have no effect: the status will remain unchanged. Re-uploading a link with deprecated status inactive is equivalent to not submitting the link at all and will delete the link if it was active or cancel the link request if it was pending.

AccountAdsLink

data AccountAdsLink Source #

accountAdsLink :: AccountAdsLink Source #

Creates a value of AccountAdsLink with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aalStatus :: Lens' AccountAdsLink (Maybe Text) Source #

Status of the link between this Merchant Center account and the Ads account. Upon retrieval, it represents the actual status of the link and can be either active if it was approved in Google Ads or pending if it's pending approval. Upon insertion, it represents the intended status of the link. Re-uploading a link with status active when it's still pending or with status pending when it's already active will have no effect: the status will remain unchanged. Re-uploading a link with deprecated status inactive is equivalent to not submitting the link at all and will delete the link if it was active or cancel the link request if it was pending.

aalAdsId :: Lens' AccountAdsLink (Maybe Word64) Source #

Customer ID of the Ads account.

LiaAboutPageSettings

data LiaAboutPageSettings Source #

Instances
Eq LiaAboutPageSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaAboutPageSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaAboutPageSettings -> c LiaAboutPageSettings #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaAboutPageSettings #

toConstr :: LiaAboutPageSettings -> Constr #

dataTypeOf :: LiaAboutPageSettings -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaAboutPageSettings) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaAboutPageSettings) #

gmapT :: (forall b. Data b => b -> b) -> LiaAboutPageSettings -> LiaAboutPageSettings #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaAboutPageSettings -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaAboutPageSettings -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaAboutPageSettings -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaAboutPageSettings -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaAboutPageSettings -> m LiaAboutPageSettings #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaAboutPageSettings -> m LiaAboutPageSettings #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaAboutPageSettings -> m LiaAboutPageSettings #

Show LiaAboutPageSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaAboutPageSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaAboutPageSettings :: Type -> Type #

ToJSON LiaAboutPageSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaAboutPageSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaAboutPageSettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaAboutPageSettings = D1 (MetaData "LiaAboutPageSettings" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaAboutPageSettings'" PrefixI True) (S1 (MetaSel (Just "_lapsStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lapsURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

liaAboutPageSettings :: LiaAboutPageSettings Source #

Creates a value of LiaAboutPageSettings with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lapsStatus :: Lens' LiaAboutPageSettings (Maybe Text) Source #

The status of the verification process for the About page.

lapsURL :: Lens' LiaAboutPageSettings (Maybe Text) Source #

The URL for the About page.

LiaSettingsCustomBatchRequest

data LiaSettingsCustomBatchRequest Source #

Instances
Eq LiaSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettingsCustomBatchRequest -> c LiaSettingsCustomBatchRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettingsCustomBatchRequest #

toConstr :: LiaSettingsCustomBatchRequest -> Constr #

dataTypeOf :: LiaSettingsCustomBatchRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettingsCustomBatchRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettingsCustomBatchRequest) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettingsCustomBatchRequest -> LiaSettingsCustomBatchRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsCustomBatchRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsCustomBatchRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettingsCustomBatchRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettingsCustomBatchRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchRequest -> m LiaSettingsCustomBatchRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchRequest -> m LiaSettingsCustomBatchRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchRequest -> m LiaSettingsCustomBatchRequest #

Show LiaSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaSettingsCustomBatchRequest :: Type -> Type #

ToJSON LiaSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsCustomBatchRequest = D1 (MetaData "LiaSettingsCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "LiaSettingsCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_lEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [LiaSettingsCustomBatchRequestEntry]))))

liaSettingsCustomBatchRequest :: LiaSettingsCustomBatchRequest Source #

Creates a value of LiaSettingsCustomBatchRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lEntries :: Lens' LiaSettingsCustomBatchRequest [LiaSettingsCustomBatchRequestEntry] Source #

The request entries to be processed in the batch.

CustomAttribute

data CustomAttribute Source #

Instances
Eq CustomAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data CustomAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CustomAttribute -> c CustomAttribute #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CustomAttribute #

toConstr :: CustomAttribute -> Constr #

dataTypeOf :: CustomAttribute -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CustomAttribute) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CustomAttribute) #

gmapT :: (forall b. Data b => b -> b) -> CustomAttribute -> CustomAttribute #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CustomAttribute -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CustomAttribute -> r #

gmapQ :: (forall d. Data d => d -> u) -> CustomAttribute -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CustomAttribute -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CustomAttribute -> m CustomAttribute #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CustomAttribute -> m CustomAttribute #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CustomAttribute -> m CustomAttribute #

Show CustomAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic CustomAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep CustomAttribute :: Type -> Type #

ToJSON CustomAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON CustomAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CustomAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CustomAttribute = D1 (MetaData "CustomAttribute" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "CustomAttribute'" PrefixI True) (S1 (MetaSel (Just "_caGroupValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [CustomAttribute])) :*: (S1 (MetaSel (Just "_caValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_caName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

customAttribute :: CustomAttribute Source #

Creates a value of CustomAttribute with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

caGroupValues :: Lens' CustomAttribute [CustomAttribute] Source #

Subattributes within this attribute group. Exactly one of value or groupValues must be provided.

caValue :: Lens' CustomAttribute (Maybe Text) Source #

The value of the attribute.

caName :: Lens' CustomAttribute (Maybe Text) Source #

The name of the attribute. Underscores will be replaced by spaces upon insertion.

PosInventoryRequest

data PosInventoryRequest Source #

Instances
Eq PosInventoryRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosInventoryRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosInventoryRequest -> c PosInventoryRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosInventoryRequest #

toConstr :: PosInventoryRequest -> Constr #

dataTypeOf :: PosInventoryRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosInventoryRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosInventoryRequest) #

gmapT :: (forall b. Data b => b -> b) -> PosInventoryRequest -> PosInventoryRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosInventoryRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosInventoryRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosInventoryRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosInventoryRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosInventoryRequest -> m PosInventoryRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosInventoryRequest -> m PosInventoryRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosInventoryRequest -> m PosInventoryRequest #

Show PosInventoryRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosInventoryRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosInventoryRequest :: Type -> Type #

ToJSON PosInventoryRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosInventoryRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosInventoryRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosInventoryRequest = D1 (MetaData "PosInventoryRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosInventoryRequest'" PrefixI True) (((S1 (MetaSel (Just "_posStoreCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_posItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_posQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_posTargetCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_posGtin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_posPrice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))) :*: (S1 (MetaSel (Just "_posContentLanguage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_posTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

posInventoryRequest :: PosInventoryRequest Source #

Creates a value of PosInventoryRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

posStoreCode :: Lens' PosInventoryRequest (Maybe Text) Source #

The identifier of the merchant's store. Either a storeCode inserted via the API or the code of the store in Google My Business.

posItemId :: Lens' PosInventoryRequest (Maybe Text) Source #

A unique identifier for the item.

posQuantity :: Lens' PosInventoryRequest (Maybe Int64) Source #

The available quantity of the item.

posTargetCountry :: Lens' PosInventoryRequest (Maybe Text) Source #

The CLDR territory code for the item.

posGtin :: Lens' PosInventoryRequest (Maybe Text) Source #

Global Trade Item Number.

posPrice :: Lens' PosInventoryRequest (Maybe Price) Source #

The current price of the item.

posContentLanguage :: Lens' PosInventoryRequest (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

posTimestamp :: Lens' PosInventoryRequest (Maybe Text) Source #

The inventory timestamp, in ISO 8601 format.

AccountstatusesCustomBatchResponse

data AccountstatusesCustomBatchResponse Source #

Instances
Eq AccountstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountstatusesCustomBatchResponse -> c AccountstatusesCustomBatchResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountstatusesCustomBatchResponse #

toConstr :: AccountstatusesCustomBatchResponse -> Constr #

dataTypeOf :: AccountstatusesCustomBatchResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountstatusesCustomBatchResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountstatusesCustomBatchResponse) #

gmapT :: (forall b. Data b => b -> b) -> AccountstatusesCustomBatchResponse -> AccountstatusesCustomBatchResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountstatusesCustomBatchResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountstatusesCustomBatchResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountstatusesCustomBatchResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountstatusesCustomBatchResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchResponse -> m AccountstatusesCustomBatchResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchResponse -> m AccountstatusesCustomBatchResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchResponse -> m AccountstatusesCustomBatchResponse #

Show AccountstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountstatusesCustomBatchResponse :: Type -> Type #

ToJSON AccountstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesCustomBatchResponse = D1 (MetaData "AccountstatusesCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountstatusesCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_acccEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountstatusesCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_acccKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

accountstatusesCustomBatchResponse :: AccountstatusesCustomBatchResponse Source #

Creates a value of AccountstatusesCustomBatchResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acccKind :: Lens' AccountstatusesCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountstatusesCustomBatchResponse".

ShippingSettingsCustomBatchResponseEntry

data ShippingSettingsCustomBatchResponseEntry Source #

A batch entry encoding a single non-batch shipping settings response.

See: shippingSettingsCustomBatchResponseEntry smart constructor.

Instances
Eq ShippingSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShippingSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShippingSettingsCustomBatchResponseEntry -> c ShippingSettingsCustomBatchResponseEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShippingSettingsCustomBatchResponseEntry #

toConstr :: ShippingSettingsCustomBatchResponseEntry -> Constr #

dataTypeOf :: ShippingSettingsCustomBatchResponseEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShippingSettingsCustomBatchResponseEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShippingSettingsCustomBatchResponseEntry) #

gmapT :: (forall b. Data b => b -> b) -> ShippingSettingsCustomBatchResponseEntry -> ShippingSettingsCustomBatchResponseEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsCustomBatchResponseEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsCustomBatchResponseEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShippingSettingsCustomBatchResponseEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShippingSettingsCustomBatchResponseEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchResponseEntry -> m ShippingSettingsCustomBatchResponseEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchResponseEntry -> m ShippingSettingsCustomBatchResponseEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchResponseEntry -> m ShippingSettingsCustomBatchResponseEntry #

Show ShippingSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShippingSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON ShippingSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShippingSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsCustomBatchResponseEntry = D1 (MetaData "ShippingSettingsCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShippingSettingsCustomBatchResponseEntry'" PrefixI True) ((S1 (MetaSel (Just "_sKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_sShippingSettings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ShippingSettings))) :*: (S1 (MetaSel (Just "_sErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: S1 (MetaSel (Just "_sBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

shippingSettingsCustomBatchResponseEntry :: ShippingSettingsCustomBatchResponseEntry Source #

Creates a value of ShippingSettingsCustomBatchResponseEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sKind :: Lens' ShippingSettingsCustomBatchResponseEntry Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#shippingsettingsCustomBatchResponseEntry".

sShippingSettings :: Lens' ShippingSettingsCustomBatchResponseEntry (Maybe ShippingSettings) Source #

The retrieved or updated account shipping settings.

sErrors :: Lens' ShippingSettingsCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if, and only if, the request failed.

sBatchId :: Lens' ShippingSettingsCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry to which this entry responds.

ProductStatus

data ProductStatus Source #

The status of a product, i.e., information about a product computed asynchronously by the data quality analysis.

See: productStatus smart constructor.

Instances
Eq ProductStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductStatus -> c ProductStatus #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductStatus #

toConstr :: ProductStatus -> Constr #

dataTypeOf :: ProductStatus -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductStatus) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductStatus) #

gmapT :: (forall b. Data b => b -> b) -> ProductStatus -> ProductStatus #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductStatus -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductStatus -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductStatus -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductStatus -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductStatus -> m ProductStatus #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductStatus -> m ProductStatus #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductStatus -> m ProductStatus #

Show ProductStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductStatus :: Type -> Type #

ToJSON ProductStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

productStatus :: ProductStatus Source #

Creates a value of ProductStatus with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ppKind :: Lens' ProductStatus Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#productStatus".

ppLink :: Lens' ProductStatus (Maybe Text) Source #

The link to the product.

ppDestinationStatuses :: Lens' ProductStatus [ProductStatusDestinationStatus] Source #

The intended destinations for the product.

ppLastUpdateDate :: Lens' ProductStatus (Maybe Text) Source #

Date on which the item has been last updated, in ISO 8601 format.

ppCreationDate :: Lens' ProductStatus (Maybe Text) Source #

Date on which the item has been created, in ISO 8601 format.

ppTitle :: Lens' ProductStatus (Maybe Text) Source #

The title of the product.

ppGoogleExpirationDate :: Lens' ProductStatus (Maybe Text) Source #

Date on which the item expires in Google Shopping, in ISO 8601 format.

ppProductId :: Lens' ProductStatus (Maybe Text) Source #

The id of the product for which status is reported.

ppItemLevelIssues :: Lens' ProductStatus [ProductStatusItemLevelIssue] Source #

A list of all issues associated with the product.

AccountstatusesListResponse

data AccountstatusesListResponse Source #

Instances
Eq AccountstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountstatusesListResponse -> c AccountstatusesListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountstatusesListResponse #

toConstr :: AccountstatusesListResponse -> Constr #

dataTypeOf :: AccountstatusesListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountstatusesListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountstatusesListResponse) #

gmapT :: (forall b. Data b => b -> b) -> AccountstatusesListResponse -> AccountstatusesListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountstatusesListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountstatusesListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountstatusesListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountstatusesListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountstatusesListResponse -> m AccountstatusesListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountstatusesListResponse -> m AccountstatusesListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountstatusesListResponse -> m AccountstatusesListResponse #

Show AccountstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountstatusesListResponse :: Type -> Type #

ToJSON AccountstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesListResponse = D1 (MetaData "AccountstatusesListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountstatusesListResponse'" PrefixI True) (S1 (MetaSel (Just "_alr1NextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_alr1Kind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_alr1Resources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountStatus])))))

accountstatusesListResponse :: AccountstatusesListResponse Source #

Creates a value of AccountstatusesListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

alr1NextPageToken :: Lens' AccountstatusesListResponse (Maybe Text) Source #

The token for the retrieval of the next page of account statuses.

alr1Kind :: Lens' AccountstatusesListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountstatusesListResponse".

OrdersSetLineItemMetadataResponse

data OrdersSetLineItemMetadataResponse Source #

Instances
Eq OrdersSetLineItemMetadataResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersSetLineItemMetadataResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersSetLineItemMetadataResponse -> c OrdersSetLineItemMetadataResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersSetLineItemMetadataResponse #

toConstr :: OrdersSetLineItemMetadataResponse -> Constr #

dataTypeOf :: OrdersSetLineItemMetadataResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersSetLineItemMetadataResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersSetLineItemMetadataResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersSetLineItemMetadataResponse -> OrdersSetLineItemMetadataResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersSetLineItemMetadataResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersSetLineItemMetadataResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersSetLineItemMetadataResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersSetLineItemMetadataResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersSetLineItemMetadataResponse -> m OrdersSetLineItemMetadataResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersSetLineItemMetadataResponse -> m OrdersSetLineItemMetadataResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersSetLineItemMetadataResponse -> m OrdersSetLineItemMetadataResponse #

Show OrdersSetLineItemMetadataResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersSetLineItemMetadataResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersSetLineItemMetadataResponse :: Type -> Type #

ToJSON OrdersSetLineItemMetadataResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersSetLineItemMetadataResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersSetLineItemMetadataResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersSetLineItemMetadataResponse = D1 (MetaData "OrdersSetLineItemMetadataResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersSetLineItemMetadataResponse'" PrefixI True) (S1 (MetaSel (Just "_oslimrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oslimrExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersSetLineItemMetadataResponse :: OrdersSetLineItemMetadataResponse Source #

Creates a value of OrdersSetLineItemMetadataResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oslimrKind :: Lens' OrdersSetLineItemMetadataResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersSetLineItemMetadataResponse".

AccounttaxCustomBatchRequest

data AccounttaxCustomBatchRequest Source #

Instances
Eq AccounttaxCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccounttaxCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccounttaxCustomBatchRequest -> c AccounttaxCustomBatchRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccounttaxCustomBatchRequest #

toConstr :: AccounttaxCustomBatchRequest -> Constr #

dataTypeOf :: AccounttaxCustomBatchRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccounttaxCustomBatchRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccounttaxCustomBatchRequest) #

gmapT :: (forall b. Data b => b -> b) -> AccounttaxCustomBatchRequest -> AccounttaxCustomBatchRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccounttaxCustomBatchRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccounttaxCustomBatchRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccounttaxCustomBatchRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccounttaxCustomBatchRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchRequest -> m AccounttaxCustomBatchRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchRequest -> m AccounttaxCustomBatchRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchRequest -> m AccounttaxCustomBatchRequest #

Show AccounttaxCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccounttaxCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccounttaxCustomBatchRequest :: Type -> Type #

ToJSON AccounttaxCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccounttaxCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxCustomBatchRequest = D1 (MetaData "AccounttaxCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "AccounttaxCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_accEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [AccounttaxCustomBatchRequestEntry]))))

accounttaxCustomBatchRequest :: AccounttaxCustomBatchRequest Source #

Creates a value of AccounttaxCustomBatchRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

accEntries :: Lens' AccounttaxCustomBatchRequest [AccounttaxCustomBatchRequestEntry] Source #

The request entries to be processed in the batch.

ProductsCustomBatchRequestEntry

data ProductsCustomBatchRequestEntry Source #

A batch entry encoding a single non-batch products request.

See: productsCustomBatchRequestEntry smart constructor.

Instances
Eq ProductsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductsCustomBatchRequestEntry -> c ProductsCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductsCustomBatchRequestEntry #

toConstr :: ProductsCustomBatchRequestEntry -> Constr #

dataTypeOf :: ProductsCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductsCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductsCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> ProductsCustomBatchRequestEntry -> ProductsCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductsCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductsCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductsCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductsCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductsCustomBatchRequestEntry -> m ProductsCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductsCustomBatchRequestEntry -> m ProductsCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductsCustomBatchRequestEntry -> m ProductsCustomBatchRequestEntry #

Show ProductsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductsCustomBatchRequestEntry :: Type -> Type #

ToJSON ProductsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsCustomBatchRequestEntry = D1 (MetaData "ProductsCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductsCustomBatchRequestEntry'" PrefixI True) ((S1 (MetaSel (Just "_prorMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_prorMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorProduct") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Product)) :*: (S1 (MetaSel (Just "_prorProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

productsCustomBatchRequestEntry :: ProductsCustomBatchRequestEntry Source #

Creates a value of ProductsCustomBatchRequestEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

prorProduct :: Lens' ProductsCustomBatchRequestEntry (Maybe Product) Source #

The product to insert. Only required if the method is insert.

prorProductId :: Lens' ProductsCustomBatchRequestEntry (Maybe Text) Source #

The ID of the product to get or delete. Only defined if the method is get or delete.

prorBatchId :: Lens' ProductsCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

AccountGoogleMyBusinessLink

data AccountGoogleMyBusinessLink Source #

accountGoogleMyBusinessLink :: AccountGoogleMyBusinessLink Source #

Creates a value of AccountGoogleMyBusinessLink with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

agmblGmbEmail :: Lens' AccountGoogleMyBusinessLink (Maybe Text) Source #

The GMB email address of which a specific account within a GMB account. A sample account within a GMB account could be a business account with set of locations, managed under the GMB account.

agmblStatus :: Lens' AccountGoogleMyBusinessLink (Maybe Text) Source #

Status of the link between this Merchant Center account and the GMB account.

DatafeedstatusesCustomBatchRequestEntry

data DatafeedstatusesCustomBatchRequestEntry Source #

A batch entry encoding a single non-batch datafeedstatuses request.

See: datafeedstatusesCustomBatchRequestEntry smart constructor.

Instances
Eq DatafeedstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedstatusesCustomBatchRequestEntry -> c DatafeedstatusesCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedstatusesCustomBatchRequestEntry #

toConstr :: DatafeedstatusesCustomBatchRequestEntry -> Constr #

dataTypeOf :: DatafeedstatusesCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedstatusesCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedstatusesCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedstatusesCustomBatchRequestEntry -> DatafeedstatusesCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedstatusesCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedstatusesCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedstatusesCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedstatusesCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchRequestEntry -> m DatafeedstatusesCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchRequestEntry -> m DatafeedstatusesCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchRequestEntry -> m DatafeedstatusesCustomBatchRequestEntry #

Show DatafeedstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON DatafeedstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesCustomBatchRequestEntry = D1 (MetaData "DatafeedstatusesCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedstatusesCustomBatchRequestEntry'" PrefixI True) ((S1 (MetaSel (Just "_dMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_dCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_dDatafeedId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_dLanguage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

datafeedstatusesCustomBatchRequestEntry :: DatafeedstatusesCustomBatchRequestEntry Source #

Creates a value of DatafeedstatusesCustomBatchRequestEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dCountry :: Lens' DatafeedstatusesCustomBatchRequestEntry (Maybe Text) Source #

The country for which to get the datafeed status. If this parameter is provided then language must also be provided. Note that for multi-target datafeeds this parameter is required.

dLanguage :: Lens' DatafeedstatusesCustomBatchRequestEntry (Maybe Text) Source #

The language for which to get the datafeed status. If this parameter is provided then country must also be provided. Note that for multi-target datafeeds this parameter is required.

dBatchId :: Lens' DatafeedstatusesCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

OrderCustomer

data OrderCustomer Source #

Instances
Eq OrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderCustomer -> c OrderCustomer #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderCustomer #

toConstr :: OrderCustomer -> Constr #

dataTypeOf :: OrderCustomer -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderCustomer) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderCustomer) #

gmapT :: (forall b. Data b => b -> b) -> OrderCustomer -> OrderCustomer #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderCustomer -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderCustomer -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderCustomer -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderCustomer -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderCustomer -> m OrderCustomer #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderCustomer -> m OrderCustomer #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderCustomer -> m OrderCustomer #

Show OrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderCustomer :: Type -> Type #

ToJSON OrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderCustomer Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderCustomer = D1 (MetaData "OrderCustomer" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderCustomer'" PrefixI True) (S1 (MetaSel (Just "_ocFullName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ocEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ocMarketingRightsInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderCustomerMarketingRightsInfo)))))

orderCustomer :: OrderCustomer Source #

Creates a value of OrderCustomer with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ocFullName :: Lens' OrderCustomer (Maybe Text) Source #

Full name of the customer.

LocationIdSet

data LocationIdSet Source #

Instances
Eq LocationIdSet Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LocationIdSet Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LocationIdSet -> c LocationIdSet #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LocationIdSet #

toConstr :: LocationIdSet -> Constr #

dataTypeOf :: LocationIdSet -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LocationIdSet) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LocationIdSet) #

gmapT :: (forall b. Data b => b -> b) -> LocationIdSet -> LocationIdSet #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LocationIdSet -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LocationIdSet -> r #

gmapQ :: (forall d. Data d => d -> u) -> LocationIdSet -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LocationIdSet -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LocationIdSet -> m LocationIdSet #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LocationIdSet -> m LocationIdSet #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LocationIdSet -> m LocationIdSet #

Show LocationIdSet Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LocationIdSet Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LocationIdSet :: Type -> Type #

ToJSON LocationIdSet Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LocationIdSet Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LocationIdSet Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LocationIdSet = D1 (MetaData "LocationIdSet" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "LocationIdSet'" PrefixI True) (S1 (MetaSel (Just "_lisLocationIds") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

locationIdSet :: LocationIdSet Source #

Creates a value of LocationIdSet with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lisLocationIds :: Lens' LocationIdSet [Text] Source #

A non-empty list of location IDs. They must all be of the same location type (e.g., state).

Row

data Row Source #

Instances
Eq Row Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Row -> Row -> Bool #

(/=) :: Row -> Row -> Bool #

Data Row Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Row -> c Row #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Row #

toConstr :: Row -> Constr #

dataTypeOf :: Row -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Row) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Row) #

gmapT :: (forall b. Data b => b -> b) -> Row -> Row #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Row -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Row -> r #

gmapQ :: (forall d. Data d => d -> u) -> Row -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Row -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Row -> m Row #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Row -> m Row #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Row -> m Row #

Show Row Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

showsPrec :: Int -> Row -> ShowS #

show :: Row -> String #

showList :: [Row] -> ShowS #

Generic Row Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Row :: Type -> Type #

Methods

from :: Row -> Rep Row x #

to :: Rep Row x -> Row #

ToJSON Row Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Row Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Row Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Row = D1 (MetaData "Row" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "Row'" PrefixI True) (S1 (MetaSel (Just "_rCells") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Value]))))

row :: Row Source #

Creates a value of Row with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rCells :: Lens' Row [Value] Source #

The list of cells that constitute the row. Must have the same length as columnHeaders for two-dimensional tables, a length of 1 for one-dimensional tables. Required.

OrdersGetByMerchantOrderIdResponse

data OrdersGetByMerchantOrderIdResponse Source #

Instances
Eq OrdersGetByMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersGetByMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersGetByMerchantOrderIdResponse -> c OrdersGetByMerchantOrderIdResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersGetByMerchantOrderIdResponse #

toConstr :: OrdersGetByMerchantOrderIdResponse -> Constr #

dataTypeOf :: OrdersGetByMerchantOrderIdResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersGetByMerchantOrderIdResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersGetByMerchantOrderIdResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersGetByMerchantOrderIdResponse -> OrdersGetByMerchantOrderIdResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersGetByMerchantOrderIdResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersGetByMerchantOrderIdResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersGetByMerchantOrderIdResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersGetByMerchantOrderIdResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersGetByMerchantOrderIdResponse -> m OrdersGetByMerchantOrderIdResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersGetByMerchantOrderIdResponse -> m OrdersGetByMerchantOrderIdResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersGetByMerchantOrderIdResponse -> m OrdersGetByMerchantOrderIdResponse #

Show OrdersGetByMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersGetByMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersGetByMerchantOrderIdResponse :: Type -> Type #

ToJSON OrdersGetByMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersGetByMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersGetByMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersGetByMerchantOrderIdResponse = D1 (MetaData "OrdersGetByMerchantOrderIdResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersGetByMerchantOrderIdResponse'" PrefixI True) (S1 (MetaSel (Just "_ogbmoirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ogbmoirOrder") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Order))))

ordersGetByMerchantOrderIdResponse :: OrdersGetByMerchantOrderIdResponse Source #

Creates a value of OrdersGetByMerchantOrderIdResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ogbmoirKind :: Lens' OrdersGetByMerchantOrderIdResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersGetByMerchantOrderIdResponse".

OrdersRejectReturnLineItemRequest

data OrdersRejectReturnLineItemRequest Source #

Instances
Eq OrdersRejectReturnLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersRejectReturnLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersRejectReturnLineItemRequest -> c OrdersRejectReturnLineItemRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersRejectReturnLineItemRequest #

toConstr :: OrdersRejectReturnLineItemRequest -> Constr #

dataTypeOf :: OrdersRejectReturnLineItemRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersRejectReturnLineItemRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersRejectReturnLineItemRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersRejectReturnLineItemRequest -> OrdersRejectReturnLineItemRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersRejectReturnLineItemRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersRejectReturnLineItemRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersRejectReturnLineItemRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersRejectReturnLineItemRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersRejectReturnLineItemRequest -> m OrdersRejectReturnLineItemRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersRejectReturnLineItemRequest -> m OrdersRejectReturnLineItemRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersRejectReturnLineItemRequest -> m OrdersRejectReturnLineItemRequest #

Show OrdersRejectReturnLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersRejectReturnLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersRejectReturnLineItemRequest :: Type -> Type #

ToJSON OrdersRejectReturnLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersRejectReturnLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersRejectReturnLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersRejectReturnLineItemRequest = D1 (MetaData "OrdersRejectReturnLineItemRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersRejectReturnLineItemRequest'" PrefixI True) ((S1 (MetaSel (Just "_orrlirQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: (S1 (MetaSel (Just "_orrlirLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_orrlirReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_orrlirOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_orrlirProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_orrlirReasonText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

ordersRejectReturnLineItemRequest :: OrdersRejectReturnLineItemRequest Source #

Creates a value of OrdersRejectReturnLineItemRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

orrlirLineItemId :: Lens' OrdersRejectReturnLineItemRequest (Maybe Text) Source #

The ID of the line item to return. Either lineItemId or productId is required.

orrlirOperationId :: Lens' OrdersRejectReturnLineItemRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

orrlirProductId :: Lens' OrdersRejectReturnLineItemRequest (Maybe Text) Source #

The ID of the product to return. This is the REST ID used in the products service. Either lineItemId or productId is required.

OrdersCancelRequest

data OrdersCancelRequest Source #

Instances
Eq OrdersCancelRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCancelRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCancelRequest -> c OrdersCancelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCancelRequest #

toConstr :: OrdersCancelRequest -> Constr #

dataTypeOf :: OrdersCancelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCancelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCancelRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCancelRequest -> OrdersCancelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCancelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCancelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCancelRequest -> m OrdersCancelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelRequest -> m OrdersCancelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelRequest -> m OrdersCancelRequest #

Show OrdersCancelRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCancelRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersCancelRequest :: Type -> Type #

ToJSON OrdersCancelRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCancelRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelRequest = D1 (MetaData "OrdersCancelRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCancelRequest'" PrefixI True) (S1 (MetaSel (Just "_ocrReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ocrOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ocrReasonText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

ordersCancelRequest :: OrdersCancelRequest Source #

Creates a value of OrdersCancelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ocrReason :: Lens' OrdersCancelRequest (Maybe Text) Source #

The reason for the cancellation.

ocrOperationId :: Lens' OrdersCancelRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

ocrReasonText :: Lens' OrdersCancelRequest (Maybe Text) Source #

The explanation of the reason.

ReturnShipment

data ReturnShipment Source #

Instances
Eq ReturnShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ReturnShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ReturnShipment -> c ReturnShipment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ReturnShipment #

toConstr :: ReturnShipment -> Constr #

dataTypeOf :: ReturnShipment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ReturnShipment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ReturnShipment) #

gmapT :: (forall b. Data b => b -> b) -> ReturnShipment -> ReturnShipment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ReturnShipment -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ReturnShipment -> r #

gmapQ :: (forall d. Data d => d -> u) -> ReturnShipment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ReturnShipment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ReturnShipment -> m ReturnShipment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ReturnShipment -> m ReturnShipment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ReturnShipment -> m ReturnShipment #

Show ReturnShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ReturnShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ReturnShipment :: Type -> Type #

ToJSON ReturnShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ReturnShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ReturnShipment Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ReturnShipment = D1 (MetaData "ReturnShipment" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ReturnShipment'" PrefixI True) ((S1 (MetaSel (Just "_rsShipmentTrackingInfos") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ShipmentTrackingInfo])) :*: S1 (MetaSel (Just "_rsReturnMethodType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_rsShipmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rsCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

returnShipment :: ReturnShipment Source #

Creates a value of ReturnShipment with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

OrdersCancelTestOrderByCustomerRequest

data OrdersCancelTestOrderByCustomerRequest Source #

Instances
Eq OrdersCancelTestOrderByCustomerRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCancelTestOrderByCustomerRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCancelTestOrderByCustomerRequest -> c OrdersCancelTestOrderByCustomerRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCancelTestOrderByCustomerRequest #

toConstr :: OrdersCancelTestOrderByCustomerRequest -> Constr #

dataTypeOf :: OrdersCancelTestOrderByCustomerRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCancelTestOrderByCustomerRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCancelTestOrderByCustomerRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCancelTestOrderByCustomerRequest -> OrdersCancelTestOrderByCustomerRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelTestOrderByCustomerRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelTestOrderByCustomerRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCancelTestOrderByCustomerRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCancelTestOrderByCustomerRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCancelTestOrderByCustomerRequest -> m OrdersCancelTestOrderByCustomerRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelTestOrderByCustomerRequest -> m OrdersCancelTestOrderByCustomerRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelTestOrderByCustomerRequest -> m OrdersCancelTestOrderByCustomerRequest #

Show OrdersCancelTestOrderByCustomerRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCancelTestOrderByCustomerRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrdersCancelTestOrderByCustomerRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCancelTestOrderByCustomerRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelTestOrderByCustomerRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelTestOrderByCustomerRequest = D1 (MetaData "OrdersCancelTestOrderByCustomerRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "OrdersCancelTestOrderByCustomerRequest'" PrefixI True) (S1 (MetaSel (Just "_octobcrReason") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

ordersCancelTestOrderByCustomerRequest :: OrdersCancelTestOrderByCustomerRequest Source #

Creates a value of OrdersCancelTestOrderByCustomerRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

TestOrderCustomerMarketingRightsInfo

data TestOrderCustomerMarketingRightsInfo Source #

Instances
Eq TestOrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data TestOrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestOrderCustomerMarketingRightsInfo -> c TestOrderCustomerMarketingRightsInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestOrderCustomerMarketingRightsInfo #

toConstr :: TestOrderCustomerMarketingRightsInfo -> Constr #

dataTypeOf :: TestOrderCustomerMarketingRightsInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestOrderCustomerMarketingRightsInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestOrderCustomerMarketingRightsInfo) #

gmapT :: (forall b. Data b => b -> b) -> TestOrderCustomerMarketingRightsInfo -> TestOrderCustomerMarketingRightsInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestOrderCustomerMarketingRightsInfo -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestOrderCustomerMarketingRightsInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> TestOrderCustomerMarketingRightsInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TestOrderCustomerMarketingRightsInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestOrderCustomerMarketingRightsInfo -> m TestOrderCustomerMarketingRightsInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestOrderCustomerMarketingRightsInfo -> m TestOrderCustomerMarketingRightsInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestOrderCustomerMarketingRightsInfo -> m TestOrderCustomerMarketingRightsInfo #

Show TestOrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic TestOrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON TestOrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON TestOrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrderCustomerMarketingRightsInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrderCustomerMarketingRightsInfo = D1 (MetaData "TestOrderCustomerMarketingRightsInfo" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "TestOrderCustomerMarketingRightsInfo'" PrefixI True) (S1 (MetaSel (Just "_tocmriExplicitMarketingPreference") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tocmriLastUpdatedTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

testOrderCustomerMarketingRightsInfo :: TestOrderCustomerMarketingRightsInfo Source #

Creates a value of TestOrderCustomerMarketingRightsInfo with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

tocmriExplicitMarketingPreference :: Lens' TestOrderCustomerMarketingRightsInfo (Maybe Text) Source #

Last know user use selection regards marketing preferences. In certain cases selection might not be known, so this field would be empty.

tocmriLastUpdatedTimestamp :: Lens' TestOrderCustomerMarketingRightsInfo (Maybe Text) Source #

Timestamp when last time marketing preference was updated. Could be empty, if user wasn't offered a selection yet.

ProductStatusItemLevelIssue

data ProductStatusItemLevelIssue Source #

Instances
Eq ProductStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductStatusItemLevelIssue -> c ProductStatusItemLevelIssue #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductStatusItemLevelIssue #

toConstr :: ProductStatusItemLevelIssue -> Constr #

dataTypeOf :: ProductStatusItemLevelIssue -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductStatusItemLevelIssue) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductStatusItemLevelIssue) #

gmapT :: (forall b. Data b => b -> b) -> ProductStatusItemLevelIssue -> ProductStatusItemLevelIssue #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductStatusItemLevelIssue -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductStatusItemLevelIssue -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductStatusItemLevelIssue -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductStatusItemLevelIssue -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductStatusItemLevelIssue -> m ProductStatusItemLevelIssue #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductStatusItemLevelIssue -> m ProductStatusItemLevelIssue #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductStatusItemLevelIssue -> m ProductStatusItemLevelIssue #

Show ProductStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductStatusItemLevelIssue :: Type -> Type #

ToJSON ProductStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductStatusItemLevelIssue Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductStatusItemLevelIssue = D1 (MetaData "ProductStatusItemLevelIssue" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductStatusItemLevelIssue'" PrefixI True) (((S1 (MetaSel (Just "_psiliDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psiliResolution") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_psiliDocumentation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psiliCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_psiliServability") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psiliAttributeName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_psiliDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psiliDetail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

productStatusItemLevelIssue :: ProductStatusItemLevelIssue Source #

Creates a value of ProductStatusItemLevelIssue with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

psiliDestination :: Lens' ProductStatusItemLevelIssue (Maybe Text) Source #

The destination the issue applies to.

psiliResolution :: Lens' ProductStatusItemLevelIssue (Maybe Text) Source #

Whether the issue can be resolved by the merchant.

psiliDocumentation :: Lens' ProductStatusItemLevelIssue (Maybe Text) Source #

The URL of a web page to help with resolving this issue.

psiliCode :: Lens' ProductStatusItemLevelIssue (Maybe Text) Source #

The error code of the issue.

psiliServability :: Lens' ProductStatusItemLevelIssue (Maybe Text) Source #

How this issue affects serving of the offer.

psiliAttributeName :: Lens' ProductStatusItemLevelIssue (Maybe Text) Source #

The attribute's name, if the issue is caused by a single attribute.

psiliDescription :: Lens' ProductStatusItemLevelIssue (Maybe Text) Source #

A short issue description in English.

psiliDetail :: Lens' ProductStatusItemLevelIssue (Maybe Text) Source #

A detailed issue description in English.

OrderLineItemProductVariantAttribute

data OrderLineItemProductVariantAttribute Source #

Instances
Eq OrderLineItemProductVariantAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderLineItemProductVariantAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderLineItemProductVariantAttribute -> c OrderLineItemProductVariantAttribute #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderLineItemProductVariantAttribute #

toConstr :: OrderLineItemProductVariantAttribute -> Constr #

dataTypeOf :: OrderLineItemProductVariantAttribute -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderLineItemProductVariantAttribute) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderLineItemProductVariantAttribute) #

gmapT :: (forall b. Data b => b -> b) -> OrderLineItemProductVariantAttribute -> OrderLineItemProductVariantAttribute #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemProductVariantAttribute -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemProductVariantAttribute -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderLineItemProductVariantAttribute -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderLineItemProductVariantAttribute -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderLineItemProductVariantAttribute -> m OrderLineItemProductVariantAttribute #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemProductVariantAttribute -> m OrderLineItemProductVariantAttribute #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemProductVariantAttribute -> m OrderLineItemProductVariantAttribute #

Show OrderLineItemProductVariantAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderLineItemProductVariantAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderLineItemProductVariantAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderLineItemProductVariantAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemProductVariantAttribute Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemProductVariantAttribute = D1 (MetaData "OrderLineItemProductVariantAttribute" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderLineItemProductVariantAttribute'" PrefixI True) (S1 (MetaSel (Just "_olipvaDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olipvaValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderLineItemProductVariantAttribute :: OrderLineItemProductVariantAttribute Source #

Creates a value of OrderLineItemProductVariantAttribute with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

RateGroup

data RateGroup Source #

Instances
Eq RateGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data RateGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RateGroup -> c RateGroup #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RateGroup #

toConstr :: RateGroup -> Constr #

dataTypeOf :: RateGroup -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RateGroup) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RateGroup) #

gmapT :: (forall b. Data b => b -> b) -> RateGroup -> RateGroup #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RateGroup -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RateGroup -> r #

gmapQ :: (forall d. Data d => d -> u) -> RateGroup -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RateGroup -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RateGroup -> m RateGroup #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RateGroup -> m RateGroup #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RateGroup -> m RateGroup #

Show RateGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic RateGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep RateGroup :: Type -> Type #

ToJSON RateGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON RateGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep RateGroup Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep RateGroup = D1 (MetaData "RateGroup" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "RateGroup'" PrefixI True) ((S1 (MetaSel (Just "_rgCarrierRates") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [CarrierRate])) :*: (S1 (MetaSel (Just "_rgName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rgApplicableShippingLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))) :*: (S1 (MetaSel (Just "_rgMainTable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Table)) :*: (S1 (MetaSel (Just "_rgSingleValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Value)) :*: S1 (MetaSel (Just "_rgSubtables") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Table]))))))

rateGroup :: RateGroup Source #

Creates a value of RateGroup with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rgCarrierRates :: Lens' RateGroup [CarrierRate] Source #

A list of carrier rates that can be referred to by mainTable or singleValue.

rgName :: Lens' RateGroup (Maybe Text) Source #

Name of the rate group. Optional. If set has to be unique within shipping service.

rgApplicableShippingLabels :: Lens' RateGroup [Text] Source #

A list of shipping labels defining the products to which this rate group applies to. This is a disjunction: only one of the labels has to match for the rate group to apply. May only be empty for the last rate group of a service. Required.

rgMainTable :: Lens' RateGroup (Maybe Table) Source #

A table defining the rate group, when singleValue is not expressive enough. Can only be set if singleValue is not set.

rgSingleValue :: Lens' RateGroup (Maybe Value) Source #

The value of the rate group (e.g. flat rate $10). Can only be set if mainTable and subtables are not set.

rgSubtables :: Lens' RateGroup [Table] Source #

A list of subtables referred to by mainTable. Can only be set if mainTable is set.

OrderPromotion

data OrderPromotion Source #

Instances
Eq OrderPromotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderPromotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderPromotion -> c OrderPromotion #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderPromotion #

toConstr :: OrderPromotion -> Constr #

dataTypeOf :: OrderPromotion -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderPromotion) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderPromotion) #

gmapT :: (forall b. Data b => b -> b) -> OrderPromotion -> OrderPromotion #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderPromotion -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderPromotion -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderPromotion -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderPromotion -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderPromotion -> m OrderPromotion #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderPromotion -> m OrderPromotion #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderPromotion -> m OrderPromotion #

Show OrderPromotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderPromotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderPromotion :: Type -> Type #

ToJSON OrderPromotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderPromotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderPromotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

orderPromotion :: OrderPromotion Source #

Creates a value of OrderPromotion with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

opShortTitle :: Lens' OrderPromotion (Maybe Text) Source #

A short title of the promotion to be shown on the checkout page.

opAppliedItems :: Lens' OrderPromotion [OrderPromotionItem] Source #

Items which this promotion have been applied to.

opPretaxValue :: Lens' OrderPromotion (Maybe Price) Source #

Estimated discount applied to pre-tax amount.

opMerchantPromotionId :: Lens' OrderPromotion (Maybe Text) Source #

This field is used to identify promotions within merchants' own systems.

opSubtype :: Lens' OrderPromotion (Maybe Text) Source #

The category of the promotion.

opTitle :: Lens' OrderPromotion (Maybe Text) Source #

The title of the promotion.

opType :: Lens' OrderPromotion (Maybe Text) Source #

The scope of the promotion.

opApplicableItems :: Lens' OrderPromotion [OrderPromotionItem] Source #

Items which this promotion may be applied to. If empty, there are no restrictions on applicable items and quantity.

opTaxValue :: Lens' OrderPromotion (Maybe Price) Source #

Estimated discount applied to tax (if allowed by law).

opFunder :: Lens' OrderPromotion (Maybe Text) Source #

The party funding the promotion.

AccountStatusProducts

data AccountStatusProducts Source #

Instances
Eq AccountStatusProducts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountStatusProducts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountStatusProducts -> c AccountStatusProducts #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountStatusProducts #

toConstr :: AccountStatusProducts -> Constr #

dataTypeOf :: AccountStatusProducts -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountStatusProducts) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountStatusProducts) #

gmapT :: (forall b. Data b => b -> b) -> AccountStatusProducts -> AccountStatusProducts #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountStatusProducts -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountStatusProducts -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountStatusProducts -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountStatusProducts -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountStatusProducts -> m AccountStatusProducts #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountStatusProducts -> m AccountStatusProducts #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountStatusProducts -> m AccountStatusProducts #

Show AccountStatusProducts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountStatusProducts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountStatusProducts :: Type -> Type #

ToJSON AccountStatusProducts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountStatusProducts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatusProducts Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatusProducts = D1 (MetaData "AccountStatusProducts" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountStatusProducts'" PrefixI True) ((S1 (MetaSel (Just "_aspDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aspCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_aspChannel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_aspStatistics") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AccountStatusStatistics)) :*: S1 (MetaSel (Just "_aspItemLevelIssues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccountStatusItemLevelIssue]))))))

accountStatusProducts :: AccountStatusProducts Source #

Creates a value of AccountStatusProducts with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aspDestination :: Lens' AccountStatusProducts (Maybe Text) Source #

The destination the data applies to.

aspCountry :: Lens' AccountStatusProducts (Maybe Text) Source #

The country the data applies to.

aspChannel :: Lens' AccountStatusProducts (Maybe Text) Source #

The channel the data applies to.

Price

data Price Source #

Instances
Eq Price Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Price -> Price -> Bool #

(/=) :: Price -> Price -> Bool #

Data Price Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Price -> c Price #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Price #

toConstr :: Price -> Constr #

dataTypeOf :: Price -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Price) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Price) #

gmapT :: (forall b. Data b => b -> b) -> Price -> Price #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Price -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Price -> r #

gmapQ :: (forall d. Data d => d -> u) -> Price -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Price -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Price -> m Price #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Price -> m Price #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Price -> m Price #

Show Price Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

showsPrec :: Int -> Price -> ShowS #

show :: Price -> String #

showList :: [Price] -> ShowS #

Generic Price Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Price :: Type -> Type #

Methods

from :: Price -> Rep Price x #

to :: Rep Price x -> Price #

ToJSON Price Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Price Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Price Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Price = D1 (MetaData "Price" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Price'" PrefixI True) (S1 (MetaSel (Just "_pValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pCurrency") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

price :: Price Source #

Creates a value of Price with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pValue :: Lens' Price (Maybe Text) Source #

The price represented as a number.

pCurrency :: Lens' Price (Maybe Text) Source #

The currency of the price.

OrderLineItemShippingDetails

data OrderLineItemShippingDetails Source #

Instances
Eq OrderLineItemShippingDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderLineItemShippingDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderLineItemShippingDetails -> c OrderLineItemShippingDetails #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderLineItemShippingDetails #

toConstr :: OrderLineItemShippingDetails -> Constr #

dataTypeOf :: OrderLineItemShippingDetails -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderLineItemShippingDetails) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderLineItemShippingDetails) #

gmapT :: (forall b. Data b => b -> b) -> OrderLineItemShippingDetails -> OrderLineItemShippingDetails #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemShippingDetails -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemShippingDetails -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderLineItemShippingDetails -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderLineItemShippingDetails -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderLineItemShippingDetails -> m OrderLineItemShippingDetails #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemShippingDetails -> m OrderLineItemShippingDetails #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemShippingDetails -> m OrderLineItemShippingDetails #

Show OrderLineItemShippingDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderLineItemShippingDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderLineItemShippingDetails :: Type -> Type #

ToJSON OrderLineItemShippingDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderLineItemShippingDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemShippingDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemShippingDetails = D1 (MetaData "OrderLineItemShippingDetails" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderLineItemShippingDetails'" PrefixI True) (S1 (MetaSel (Just "_olisdShipByDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_olisdMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderLineItemShippingDetailsMethod)) :*: S1 (MetaSel (Just "_olisdDeliverByDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

orderLineItemShippingDetails :: OrderLineItemShippingDetails Source #

Creates a value of OrderLineItemShippingDetails with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

olisdShipByDate :: Lens' OrderLineItemShippingDetails (Maybe Text) Source #

The ship by date, in ISO 8601 format.

olisdDeliverByDate :: Lens' OrderLineItemShippingDetails (Maybe Text) Source #

The delivery by date, in ISO 8601 format.

DatafeedsCustomBatchResponse

data DatafeedsCustomBatchResponse Source #

Instances
Eq DatafeedsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedsCustomBatchResponse -> c DatafeedsCustomBatchResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedsCustomBatchResponse #

toConstr :: DatafeedsCustomBatchResponse -> Constr #

dataTypeOf :: DatafeedsCustomBatchResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedsCustomBatchResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedsCustomBatchResponse) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedsCustomBatchResponse -> DatafeedsCustomBatchResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsCustomBatchResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsCustomBatchResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedsCustomBatchResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedsCustomBatchResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchResponse -> m DatafeedsCustomBatchResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchResponse -> m DatafeedsCustomBatchResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchResponse -> m DatafeedsCustomBatchResponse #

Show DatafeedsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedsCustomBatchResponse :: Type -> Type #

ToJSON DatafeedsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsCustomBatchResponse = D1 (MetaData "DatafeedsCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedsCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_datEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DatafeedsCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_datKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

datafeedsCustomBatchResponse :: DatafeedsCustomBatchResponse Source #

Creates a value of DatafeedsCustomBatchResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

datEntries :: Lens' DatafeedsCustomBatchResponse [DatafeedsCustomBatchResponseEntry] Source #

The result of the execution of the batch requests.

datKind :: Lens' DatafeedsCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#datafeedsCustomBatchResponse".

InvoiceSummary

data InvoiceSummary Source #

Instances
Eq InvoiceSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data InvoiceSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InvoiceSummary -> c InvoiceSummary #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InvoiceSummary #

toConstr :: InvoiceSummary -> Constr #

dataTypeOf :: InvoiceSummary -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InvoiceSummary) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InvoiceSummary) #

gmapT :: (forall b. Data b => b -> b) -> InvoiceSummary -> InvoiceSummary #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InvoiceSummary -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InvoiceSummary -> r #

gmapQ :: (forall d. Data d => d -> u) -> InvoiceSummary -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InvoiceSummary -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InvoiceSummary -> m InvoiceSummary #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InvoiceSummary -> m InvoiceSummary #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InvoiceSummary -> m InvoiceSummary #

Show InvoiceSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic InvoiceSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep InvoiceSummary :: Type -> Type #

ToJSON InvoiceSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON InvoiceSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep InvoiceSummary Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep InvoiceSummary = D1 (MetaData "InvoiceSummary" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "InvoiceSummary'" PrefixI True) ((S1 (MetaSel (Just "_isMerchantBalance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Amount)) :*: (S1 (MetaSel (Just "_isCustomerBalance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Amount)) :*: S1 (MetaSel (Just "_isGoogleBalance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Amount)))) :*: (S1 (MetaSel (Just "_isProductTotal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Amount)) :*: (S1 (MetaSel (Just "_isAdditionalChargeSummaries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [InvoiceSummaryAdditionalChargeSummary])) :*: S1 (MetaSel (Just "_isPromotionSummaries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Promotion]))))))

invoiceSummary :: InvoiceSummary Source #

Creates a value of InvoiceSummary with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

isMerchantBalance :: Lens' InvoiceSummary (Maybe Amount) Source #

required
Merchant balance on this invoice. A negative amount means the merchant is paying, a positive one means the merchant is receiving money. Note: the sum of merchant_balance, customer_balance and google_balance must always be zero.

isCustomerBalance :: Lens' InvoiceSummary (Maybe Amount) Source #

required
Customer balance on this invoice. A negative amount means the customer is paying, a positive one means the customer is receiving money. Note: the sum of merchant_balance, customer_balance and google_balance must always be zero. Furthermore the absolute value of this amount is expected to be equal to the sum of product amount and additional charges, minus promotions.

isGoogleBalance :: Lens' InvoiceSummary (Maybe Amount) Source #

required
Google balance on this invoice. A negative amount means Google is paying, a positive one means Google is receiving money. Note: the sum of merchant_balance, customer_balance and google_balance must always be zero.

isProductTotal :: Lens' InvoiceSummary (Maybe Amount) Source #

required
Total price for the product.

isAdditionalChargeSummaries :: Lens' InvoiceSummary [InvoiceSummaryAdditionalChargeSummary] Source #

Summary of the total amounts of the additional charges.

isPromotionSummaries :: Lens' InvoiceSummary [Promotion] Source #

Summary for each promotion.

OrderpaymentsNotifyChargeResponse

data OrderpaymentsNotifyChargeResponse Source #

Instances
Eq OrderpaymentsNotifyChargeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderpaymentsNotifyChargeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderpaymentsNotifyChargeResponse -> c OrderpaymentsNotifyChargeResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderpaymentsNotifyChargeResponse #

toConstr :: OrderpaymentsNotifyChargeResponse -> Constr #

dataTypeOf :: OrderpaymentsNotifyChargeResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderpaymentsNotifyChargeResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderpaymentsNotifyChargeResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrderpaymentsNotifyChargeResponse -> OrderpaymentsNotifyChargeResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyChargeResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyChargeResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderpaymentsNotifyChargeResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderpaymentsNotifyChargeResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyChargeResponse -> m OrderpaymentsNotifyChargeResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyChargeResponse -> m OrderpaymentsNotifyChargeResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyChargeResponse -> m OrderpaymentsNotifyChargeResponse #

Show OrderpaymentsNotifyChargeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderpaymentsNotifyChargeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderpaymentsNotifyChargeResponse :: Type -> Type #

ToJSON OrderpaymentsNotifyChargeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderpaymentsNotifyChargeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyChargeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyChargeResponse = D1 (MetaData "OrderpaymentsNotifyChargeResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderpaymentsNotifyChargeResponse'" PrefixI True) (S1 (MetaSel (Just "_oncrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oncrExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderpaymentsNotifyChargeResponse :: OrderpaymentsNotifyChargeResponse Source #

Creates a value of OrderpaymentsNotifyChargeResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oncrKind :: Lens' OrderpaymentsNotifyChargeResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderpaymentsNotifyChargeResponse".

OrderpaymentsNotifyAuthDeclinedRequest

data OrderpaymentsNotifyAuthDeclinedRequest Source #

Instances
Eq OrderpaymentsNotifyAuthDeclinedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderpaymentsNotifyAuthDeclinedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderpaymentsNotifyAuthDeclinedRequest -> c OrderpaymentsNotifyAuthDeclinedRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderpaymentsNotifyAuthDeclinedRequest #

toConstr :: OrderpaymentsNotifyAuthDeclinedRequest -> Constr #

dataTypeOf :: OrderpaymentsNotifyAuthDeclinedRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderpaymentsNotifyAuthDeclinedRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderpaymentsNotifyAuthDeclinedRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrderpaymentsNotifyAuthDeclinedRequest -> OrderpaymentsNotifyAuthDeclinedRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyAuthDeclinedRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyAuthDeclinedRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderpaymentsNotifyAuthDeclinedRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderpaymentsNotifyAuthDeclinedRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthDeclinedRequest -> m OrderpaymentsNotifyAuthDeclinedRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthDeclinedRequest -> m OrderpaymentsNotifyAuthDeclinedRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyAuthDeclinedRequest -> m OrderpaymentsNotifyAuthDeclinedRequest #

Show OrderpaymentsNotifyAuthDeclinedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderpaymentsNotifyAuthDeclinedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderpaymentsNotifyAuthDeclinedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderpaymentsNotifyAuthDeclinedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyAuthDeclinedRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyAuthDeclinedRequest = D1 (MetaData "OrderpaymentsNotifyAuthDeclinedRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "OrderpaymentsNotifyAuthDeclinedRequest'" PrefixI True) (S1 (MetaSel (Just "_onadrDeclineReason") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

orderpaymentsNotifyAuthDeclinedRequest :: OrderpaymentsNotifyAuthDeclinedRequest Source #

Creates a value of OrderpaymentsNotifyAuthDeclinedRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

onadrDeclineReason :: Lens' OrderpaymentsNotifyAuthDeclinedRequest (Maybe Text) Source #

Reason why payment authorization was declined.

PosListResponse

data PosListResponse Source #

Instances
Eq PosListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosListResponse -> c PosListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosListResponse #

toConstr :: PosListResponse -> Constr #

dataTypeOf :: PosListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosListResponse) #

gmapT :: (forall b. Data b => b -> b) -> PosListResponse -> PosListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosListResponse -> m PosListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosListResponse -> m PosListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosListResponse -> m PosListResponse #

Show PosListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosListResponse :: Type -> Type #

ToJSON PosListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosListResponse = D1 (MetaData "PosListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosListResponse'" PrefixI True) (S1 (MetaSel (Just "_plrlKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_plrlResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PosStore]))))

posListResponse :: PosListResponse Source #

Creates a value of PosListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

plrlKind :: Lens' PosListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#posListResponse".

OrderDeliveryDetails

data OrderDeliveryDetails Source #

Instances
Eq OrderDeliveryDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderDeliveryDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderDeliveryDetails -> c OrderDeliveryDetails #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderDeliveryDetails #

toConstr :: OrderDeliveryDetails -> Constr #

dataTypeOf :: OrderDeliveryDetails -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderDeliveryDetails) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderDeliveryDetails) #

gmapT :: (forall b. Data b => b -> b) -> OrderDeliveryDetails -> OrderDeliveryDetails #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderDeliveryDetails -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderDeliveryDetails -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderDeliveryDetails -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderDeliveryDetails -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderDeliveryDetails -> m OrderDeliveryDetails #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderDeliveryDetails -> m OrderDeliveryDetails #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderDeliveryDetails -> m OrderDeliveryDetails #

Show OrderDeliveryDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderDeliveryDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderDeliveryDetails :: Type -> Type #

ToJSON OrderDeliveryDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderDeliveryDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderDeliveryDetails Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderDeliveryDetails = D1 (MetaData "OrderDeliveryDetails" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderDeliveryDetails'" PrefixI True) (S1 (MetaSel (Just "_oddAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderAddress)) :*: S1 (MetaSel (Just "_oddPhoneNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderDeliveryDetails :: OrderDeliveryDetails Source #

Creates a value of OrderDeliveryDetails with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oddPhoneNumber :: Lens' OrderDeliveryDetails (Maybe Text) Source #

The phone number of the person receiving the delivery.

OrderLineItemProductFee

data OrderLineItemProductFee Source #

Instances
Eq OrderLineItemProductFee Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderLineItemProductFee Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderLineItemProductFee -> c OrderLineItemProductFee #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderLineItemProductFee #

toConstr :: OrderLineItemProductFee -> Constr #

dataTypeOf :: OrderLineItemProductFee -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderLineItemProductFee) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderLineItemProductFee) #

gmapT :: (forall b. Data b => b -> b) -> OrderLineItemProductFee -> OrderLineItemProductFee #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemProductFee -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemProductFee -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderLineItemProductFee -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderLineItemProductFee -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderLineItemProductFee -> m OrderLineItemProductFee #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemProductFee -> m OrderLineItemProductFee #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemProductFee -> m OrderLineItemProductFee #

Show OrderLineItemProductFee Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderLineItemProductFee Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderLineItemProductFee :: Type -> Type #

ToJSON OrderLineItemProductFee Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderLineItemProductFee Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemProductFee Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemProductFee = D1 (MetaData "OrderLineItemProductFee" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderLineItemProductFee'" PrefixI True) (S1 (MetaSel (Just "_olipfAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_olipfName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderLineItemProductFee :: OrderLineItemProductFee Source #

Creates a value of OrderLineItemProductFee with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

OrdersCancelResponse

data OrdersCancelResponse Source #

Instances
Eq OrdersCancelResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCancelResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCancelResponse -> c OrdersCancelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCancelResponse #

toConstr :: OrdersCancelResponse -> Constr #

dataTypeOf :: OrdersCancelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCancelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCancelResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCancelResponse -> OrdersCancelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCancelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCancelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCancelResponse -> m OrdersCancelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelResponse -> m OrdersCancelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelResponse -> m OrdersCancelResponse #

Show OrdersCancelResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCancelResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersCancelResponse :: Type -> Type #

ToJSON OrdersCancelResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCancelResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelResponse = D1 (MetaData "OrdersCancelResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCancelResponse'" PrefixI True) (S1 (MetaSel (Just "_ocrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ocrExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersCancelResponse :: OrdersCancelResponse Source #

Creates a value of OrdersCancelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ocrKind :: Lens' OrdersCancelResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersCancelResponse".

OrdersSetLineItemMetadataRequest

data OrdersSetLineItemMetadataRequest Source #

Instances
Eq OrdersSetLineItemMetadataRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersSetLineItemMetadataRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersSetLineItemMetadataRequest -> c OrdersSetLineItemMetadataRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersSetLineItemMetadataRequest #

toConstr :: OrdersSetLineItemMetadataRequest -> Constr #

dataTypeOf :: OrdersSetLineItemMetadataRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersSetLineItemMetadataRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersSetLineItemMetadataRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersSetLineItemMetadataRequest -> OrdersSetLineItemMetadataRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersSetLineItemMetadataRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersSetLineItemMetadataRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersSetLineItemMetadataRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersSetLineItemMetadataRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersSetLineItemMetadataRequest -> m OrdersSetLineItemMetadataRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersSetLineItemMetadataRequest -> m OrdersSetLineItemMetadataRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersSetLineItemMetadataRequest -> m OrdersSetLineItemMetadataRequest #

Show OrdersSetLineItemMetadataRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersSetLineItemMetadataRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersSetLineItemMetadataRequest :: Type -> Type #

ToJSON OrdersSetLineItemMetadataRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersSetLineItemMetadataRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersSetLineItemMetadataRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersSetLineItemMetadataRequest = D1 (MetaData "OrdersSetLineItemMetadataRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersSetLineItemMetadataRequest'" PrefixI True) ((S1 (MetaSel (Just "_oslimrAnnotations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderMerchantProvidedAnnotation])) :*: S1 (MetaSel (Just "_oslimrLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_oslimrOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oslimrProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

ordersSetLineItemMetadataRequest :: OrdersSetLineItemMetadataRequest Source #

Creates a value of OrdersSetLineItemMetadataRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oslimrLineItemId :: Lens' OrdersSetLineItemMetadataRequest (Maybe Text) Source #

The ID of the line item to set metadata. Either lineItemId or productId is required.

oslimrOperationId :: Lens' OrdersSetLineItemMetadataRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

oslimrProductId :: Lens' OrdersSetLineItemMetadataRequest (Maybe Text) Source #

The ID of the product to set metadata. This is the REST ID used in the products service. Either lineItemId or productId is required.

OrdersRejectReturnLineItemResponse

data OrdersRejectReturnLineItemResponse Source #

Instances
Eq OrdersRejectReturnLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersRejectReturnLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersRejectReturnLineItemResponse -> c OrdersRejectReturnLineItemResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersRejectReturnLineItemResponse #

toConstr :: OrdersRejectReturnLineItemResponse -> Constr #

dataTypeOf :: OrdersRejectReturnLineItemResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersRejectReturnLineItemResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersRejectReturnLineItemResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersRejectReturnLineItemResponse -> OrdersRejectReturnLineItemResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersRejectReturnLineItemResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersRejectReturnLineItemResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersRejectReturnLineItemResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersRejectReturnLineItemResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersRejectReturnLineItemResponse -> m OrdersRejectReturnLineItemResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersRejectReturnLineItemResponse -> m OrdersRejectReturnLineItemResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersRejectReturnLineItemResponse -> m OrdersRejectReturnLineItemResponse #

Show OrdersRejectReturnLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersRejectReturnLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersRejectReturnLineItemResponse :: Type -> Type #

ToJSON OrdersRejectReturnLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersRejectReturnLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersRejectReturnLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersRejectReturnLineItemResponse = D1 (MetaData "OrdersRejectReturnLineItemResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersRejectReturnLineItemResponse'" PrefixI True) (S1 (MetaSel (Just "_ordKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ordExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersRejectReturnLineItemResponse :: OrdersRejectReturnLineItemResponse Source #

Creates a value of OrdersRejectReturnLineItemResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ordKind :: Lens' OrdersRejectReturnLineItemResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersRejectReturnLineItemResponse".

TestOrder

data TestOrder Source #

Instances
Eq TestOrder Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data TestOrder Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestOrder -> c TestOrder #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestOrder #

toConstr :: TestOrder -> Constr #

dataTypeOf :: TestOrder -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestOrder) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestOrder) #

gmapT :: (forall b. Data b => b -> b) -> TestOrder -> TestOrder #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestOrder -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestOrder -> r #

gmapQ :: (forall d. Data d => d -> u) -> TestOrder -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TestOrder -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestOrder -> m TestOrder #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestOrder -> m TestOrder #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestOrder -> m TestOrder #

Show TestOrder Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic TestOrder Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep TestOrder :: Type -> Type #

ToJSON TestOrder Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON TestOrder Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrder Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

testOrder :: TestOrder Source #

Creates a value of TestOrder with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

toKind :: Lens' TestOrder Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#testOrder".

toLineItems :: Lens' TestOrder [TestOrderLineItem] Source #

Line items that are ordered. At least one line item must be provided.

toShippingOption :: Lens' TestOrder (Maybe Text) Source #

The requested shipping option.

toPredefinedDeliveryAddress :: Lens' TestOrder (Maybe Text) Source #

Identifier of one of the predefined delivery addresses for the delivery.

toShippingCostTax :: Lens' TestOrder (Maybe Price) Source #

The tax for the total shipping cost.

toCustomer :: Lens' TestOrder (Maybe TestOrderCustomer) Source #

The details of the customer who placed the order.

toEnableOrderinvoices :: Lens' TestOrder (Maybe Bool) Source #

Whether the orderinvoices service should support this order.

toPromotions :: Lens' TestOrder [OrderPromotion] Source #

Promotions associated with the order.

toNotificationMode :: Lens' TestOrder (Maybe Text) Source #

Determines if test order must be pulled by merchant or pushed to merchant via push integration.

toShippingCost :: Lens' TestOrder (Maybe Price) Source #

The total cost of shipping for all items.

CutoffTime

data CutoffTime Source #

Instances
Eq CutoffTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data CutoffTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CutoffTime -> c CutoffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CutoffTime #

toConstr :: CutoffTime -> Constr #

dataTypeOf :: CutoffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CutoffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CutoffTime) #

gmapT :: (forall b. Data b => b -> b) -> CutoffTime -> CutoffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CutoffTime -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CutoffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> CutoffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CutoffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CutoffTime -> m CutoffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CutoffTime -> m CutoffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CutoffTime -> m CutoffTime #

Show CutoffTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic CutoffTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep CutoffTime :: Type -> Type #

ToJSON CutoffTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON CutoffTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CutoffTime Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep CutoffTime = D1 (MetaData "CutoffTime" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "CutoffTime'" PrefixI True) (S1 (MetaSel (Just "_ctHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: (S1 (MetaSel (Just "_ctTimezone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ctMinute") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

cutoffTime :: CutoffTime Source #

Creates a value of CutoffTime with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ctHour :: Lens' CutoffTime (Maybe Word32) Source #

Hour of the cutoff time until which an order has to be placed to be processed in the same day. Required.

ctTimezone :: Lens' CutoffTime (Maybe Text) Source #

Timezone identifier for the cutoff time. A list of identifiers can be found in the AdWords API documentation. E.g. "Europe/Zurich". Required.

ctMinute :: Lens' CutoffTime (Maybe Word32) Source #

Minute of the cutoff time until which an order has to be placed to be processed in the same day. Required.

DatafeedstatusesCustomBatchResponseEntry

data DatafeedstatusesCustomBatchResponseEntry Source #

A batch entry encoding a single non-batch datafeedstatuses response.

See: datafeedstatusesCustomBatchResponseEntry smart constructor.

Instances
Eq DatafeedstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedstatusesCustomBatchResponseEntry -> c DatafeedstatusesCustomBatchResponseEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedstatusesCustomBatchResponseEntry #

toConstr :: DatafeedstatusesCustomBatchResponseEntry -> Constr #

dataTypeOf :: DatafeedstatusesCustomBatchResponseEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedstatusesCustomBatchResponseEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedstatusesCustomBatchResponseEntry) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedstatusesCustomBatchResponseEntry -> DatafeedstatusesCustomBatchResponseEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedstatusesCustomBatchResponseEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedstatusesCustomBatchResponseEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedstatusesCustomBatchResponseEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedstatusesCustomBatchResponseEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchResponseEntry -> m DatafeedstatusesCustomBatchResponseEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchResponseEntry -> m DatafeedstatusesCustomBatchResponseEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchResponseEntry -> m DatafeedstatusesCustomBatchResponseEntry #

Show DatafeedstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON DatafeedstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesCustomBatchResponseEntry = D1 (MetaData "DatafeedstatusesCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedstatusesCustomBatchResponseEntry'" PrefixI True) (S1 (MetaSel (Just "_datErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: (S1 (MetaSel (Just "_datDatafeedStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DatafeedStatus)) :*: S1 (MetaSel (Just "_datBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

datafeedstatusesCustomBatchResponseEntry :: DatafeedstatusesCustomBatchResponseEntry Source #

Creates a value of DatafeedstatusesCustomBatchResponseEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

datErrors :: Lens' DatafeedstatusesCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if and only if the request failed.

datDatafeedStatus :: Lens' DatafeedstatusesCustomBatchResponseEntry (Maybe DatafeedStatus) Source #

The requested data feed status. Defined if and only if the request was successful.

datBatchId :: Lens' DatafeedstatusesCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry this entry responds to.

OrderRefund

data OrderRefund Source #

Instances
Eq OrderRefund Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderRefund Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderRefund -> c OrderRefund #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderRefund #

toConstr :: OrderRefund -> Constr #

dataTypeOf :: OrderRefund -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderRefund) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderRefund) #

gmapT :: (forall b. Data b => b -> b) -> OrderRefund -> OrderRefund #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderRefund -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderRefund -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderRefund -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderRefund -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderRefund -> m OrderRefund #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderRefund -> m OrderRefund #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderRefund -> m OrderRefund #

Show OrderRefund Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderRefund Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderRefund :: Type -> Type #

ToJSON OrderRefund Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderRefund Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderRefund Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderRefund = D1 (MetaData "OrderRefund" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderRefund'" PrefixI True) ((S1 (MetaSel (Just "_ordAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_ordActor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ordReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ordCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ordReasonText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

orderRefund :: OrderRefund Source #

Creates a value of OrderRefund with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ordAmount :: Lens' OrderRefund (Maybe Price) Source #

The amount that is refunded.

ordActor :: Lens' OrderRefund (Maybe Text) Source #

The actor that created the refund.

ordReason :: Lens' OrderRefund (Maybe Text) Source #

The reason for the refund.

ordCreationDate :: Lens' OrderRefund (Maybe Text) Source #

Date on which the item has been created, in ISO 8601 format.

ordReasonText :: Lens' OrderRefund (Maybe Text) Source #

The explanation of the reason.

TestOrderLineItemProduct

data TestOrderLineItemProduct Source #

Instances
Eq TestOrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data TestOrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestOrderLineItemProduct -> c TestOrderLineItemProduct #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestOrderLineItemProduct #

toConstr :: TestOrderLineItemProduct -> Constr #

dataTypeOf :: TestOrderLineItemProduct -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestOrderLineItemProduct) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestOrderLineItemProduct) #

gmapT :: (forall b. Data b => b -> b) -> TestOrderLineItemProduct -> TestOrderLineItemProduct #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestOrderLineItemProduct -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestOrderLineItemProduct -> r #

gmapQ :: (forall d. Data d => d -> u) -> TestOrderLineItemProduct -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TestOrderLineItemProduct -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestOrderLineItemProduct -> m TestOrderLineItemProduct #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestOrderLineItemProduct -> m TestOrderLineItemProduct #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestOrderLineItemProduct -> m TestOrderLineItemProduct #

Show TestOrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic TestOrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep TestOrderLineItemProduct :: Type -> Type #

ToJSON TestOrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON TestOrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrderLineItemProduct = D1 (MetaData "TestOrderLineItemProduct" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "TestOrderLineItemProduct'" PrefixI True) (((S1 (MetaSel (Just "_tolipImageLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_tolipChannel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tolipBrand") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_tolipTargetCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_tolipGtin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tolipItemGroupId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_tolipOfferId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_tolipPrice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_tolipVariantAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderLineItemProductVariantAttribute])))) :*: ((S1 (MetaSel (Just "_tolipTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tolipContentLanguage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_tolipMpn") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tolipCondition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

tolipTargetCountry :: Lens' TestOrderLineItemProduct (Maybe Text) Source #

The CLDR territory code of the target country of the product.

tolipGtin :: Lens' TestOrderLineItemProduct (Maybe Text) Source #

Global Trade Item Number (GTIN) of the item. Optional.

tolipItemGroupId :: Lens' TestOrderLineItemProduct (Maybe Text) Source #

Shared identifier for all variants of the same product. Optional.

tolipContentLanguage :: Lens' TestOrderLineItemProduct (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

tolipMpn :: Lens' TestOrderLineItemProduct (Maybe Text) Source #

Manufacturer Part Number (MPN) of the item. Optional.

tolipCondition :: Lens' TestOrderLineItemProduct (Maybe Text) Source #

Condition or state of the item.

AccounttaxCustomBatchResponse

data AccounttaxCustomBatchResponse Source #

Instances
Eq AccounttaxCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccounttaxCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccounttaxCustomBatchResponse -> c AccounttaxCustomBatchResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccounttaxCustomBatchResponse #

toConstr :: AccounttaxCustomBatchResponse -> Constr #

dataTypeOf :: AccounttaxCustomBatchResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccounttaxCustomBatchResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccounttaxCustomBatchResponse) #

gmapT :: (forall b. Data b => b -> b) -> AccounttaxCustomBatchResponse -> AccounttaxCustomBatchResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccounttaxCustomBatchResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccounttaxCustomBatchResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccounttaxCustomBatchResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccounttaxCustomBatchResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchResponse -> m AccounttaxCustomBatchResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchResponse -> m AccounttaxCustomBatchResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchResponse -> m AccounttaxCustomBatchResponse #

Show AccounttaxCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccounttaxCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccounttaxCustomBatchResponse :: Type -> Type #

ToJSON AccounttaxCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccounttaxCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxCustomBatchResponse = D1 (MetaData "AccounttaxCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccounttaxCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_acbr1Entries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccounttaxCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_acbr1Kind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

accounttaxCustomBatchResponse :: AccounttaxCustomBatchResponse Source #

Creates a value of AccounttaxCustomBatchResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acbr1Entries :: Lens' AccounttaxCustomBatchResponse [AccounttaxCustomBatchResponseEntry] Source #

The result of the execution of the batch requests.

acbr1Kind :: Lens' AccounttaxCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accounttaxCustomBatchResponse".

AccountsClaimWebsiteResponse

data AccountsClaimWebsiteResponse Source #

Instances
Eq AccountsClaimWebsiteResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsClaimWebsiteResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountsClaimWebsiteResponse -> c AccountsClaimWebsiteResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountsClaimWebsiteResponse #

toConstr :: AccountsClaimWebsiteResponse -> Constr #

dataTypeOf :: AccountsClaimWebsiteResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountsClaimWebsiteResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountsClaimWebsiteResponse) #

gmapT :: (forall b. Data b => b -> b) -> AccountsClaimWebsiteResponse -> AccountsClaimWebsiteResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountsClaimWebsiteResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountsClaimWebsiteResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountsClaimWebsiteResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountsClaimWebsiteResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountsClaimWebsiteResponse -> m AccountsClaimWebsiteResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsClaimWebsiteResponse -> m AccountsClaimWebsiteResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsClaimWebsiteResponse -> m AccountsClaimWebsiteResponse #

Show AccountsClaimWebsiteResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsClaimWebsiteResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsClaimWebsiteResponse :: Type -> Type #

ToJSON AccountsClaimWebsiteResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsClaimWebsiteResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsClaimWebsiteResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsClaimWebsiteResponse = D1 (MetaData "AccountsClaimWebsiteResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "AccountsClaimWebsiteResponse'" PrefixI True) (S1 (MetaSel (Just "_acwrKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

accountsClaimWebsiteResponse :: AccountsClaimWebsiteResponse Source #

Creates a value of AccountsClaimWebsiteResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acwrKind :: Lens' AccountsClaimWebsiteResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#accountsClaimWebsiteResponse".

OrderAddress

data OrderAddress Source #

Instances
Eq OrderAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderAddress -> c OrderAddress #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderAddress #

toConstr :: OrderAddress -> Constr #

dataTypeOf :: OrderAddress -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderAddress) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderAddress) #

gmapT :: (forall b. Data b => b -> b) -> OrderAddress -> OrderAddress #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderAddress -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderAddress -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderAddress -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderAddress -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderAddress -> m OrderAddress #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderAddress -> m OrderAddress #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderAddress -> m OrderAddress #

Show OrderAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderAddress :: Type -> Type #

ToJSON OrderAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderAddress Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderAddress = D1 (MetaData "OrderAddress" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderAddress'" PrefixI True) (((S1 (MetaSel (Just "_oaRecipientName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oaStreetAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_oaCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oaPostalCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_oaLocality") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oaIsPostOfficeBox") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_oaFullAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_oaRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

orderAddress :: OrderAddress Source #

Creates a value of OrderAddress with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oaRecipientName :: Lens' OrderAddress (Maybe Text) Source #

Name of the recipient.

oaStreetAddress :: Lens' OrderAddress [Text] Source #

Street-level part of the address.

oaCountry :: Lens' OrderAddress (Maybe Text) Source #

CLDR country code (e.g. "US").

oaPostalCode :: Lens' OrderAddress (Maybe Text) Source #

Postal Code or ZIP (e.g. "94043").

oaLocality :: Lens' OrderAddress (Maybe Text) Source #

City, town or commune. May also include dependent localities or sublocalities (e.g. neighborhoods or suburbs).

oaIsPostOfficeBox :: Lens' OrderAddress (Maybe Bool) Source #

Whether the address is a post office box.

oaFullAddress :: Lens' OrderAddress [Text] Source #

Strings representing the lines of the printed label for mailing the order, for example: John Smith 1600 Amphitheatre Parkway Mountain View, CA, 94043 United States

oaRegion :: Lens' OrderAddress (Maybe Text) Source #

Top-level administrative subdivision of the country. For example, a state like California ("CA") or a province like Quebec ("QC").

OrdersCustomBatchRequestEntryCreateTestReturnReturnItem

data OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source #

Instances
Eq OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> c OrdersCustomBatchRequestEntryCreateTestReturnReturnItem #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCustomBatchRequestEntryCreateTestReturnReturnItem #

toConstr :: OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> Constr #

dataTypeOf :: OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCustomBatchRequestEntryCreateTestReturnReturnItem) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCustomBatchRequestEntryCreateTestReturnReturnItem) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> m OrdersCustomBatchRequestEntryCreateTestReturnReturnItem #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> m OrdersCustomBatchRequestEntryCreateTestReturnReturnItem #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCustomBatchRequestEntryCreateTestReturnReturnItem -> m OrdersCustomBatchRequestEntryCreateTestReturnReturnItem #

Show OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCustomBatchRequestEntryCreateTestReturnReturnItem = D1 (MetaData "OrdersCustomBatchRequestEntryCreateTestReturnReturnItem" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCustomBatchRequestEntryCreateTestReturnReturnItem'" PrefixI True) (S1 (MetaSel (Just "_ocbrectrriQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_ocbrectrriLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersCustomBatchRequestEntryCreateTestReturnReturnItem :: OrdersCustomBatchRequestEntryCreateTestReturnReturnItem Source #

Creates a value of OrdersCustomBatchRequestEntryCreateTestReturnReturnItem with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ProductUnitPricingBaseMeasure

data ProductUnitPricingBaseMeasure Source #

Instances
Eq ProductUnitPricingBaseMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductUnitPricingBaseMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductUnitPricingBaseMeasure -> c ProductUnitPricingBaseMeasure #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductUnitPricingBaseMeasure #

toConstr :: ProductUnitPricingBaseMeasure -> Constr #

dataTypeOf :: ProductUnitPricingBaseMeasure -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductUnitPricingBaseMeasure) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductUnitPricingBaseMeasure) #

gmapT :: (forall b. Data b => b -> b) -> ProductUnitPricingBaseMeasure -> ProductUnitPricingBaseMeasure #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductUnitPricingBaseMeasure -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductUnitPricingBaseMeasure -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductUnitPricingBaseMeasure -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductUnitPricingBaseMeasure -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductUnitPricingBaseMeasure -> m ProductUnitPricingBaseMeasure #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductUnitPricingBaseMeasure -> m ProductUnitPricingBaseMeasure #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductUnitPricingBaseMeasure -> m ProductUnitPricingBaseMeasure #

Show ProductUnitPricingBaseMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductUnitPricingBaseMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductUnitPricingBaseMeasure :: Type -> Type #

ToJSON ProductUnitPricingBaseMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductUnitPricingBaseMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductUnitPricingBaseMeasure Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductUnitPricingBaseMeasure = D1 (MetaData "ProductUnitPricingBaseMeasure" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductUnitPricingBaseMeasure'" PrefixI True) (S1 (MetaSel (Just "_pupbmValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_pupbmUnit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

productUnitPricingBaseMeasure :: ProductUnitPricingBaseMeasure Source #

Creates a value of ProductUnitPricingBaseMeasure with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pupbmValue :: Lens' ProductUnitPricingBaseMeasure (Maybe Int64) Source #

The denominator of the unit price.

LiaSettingsGetAccessibleGmbAccountsResponse

data LiaSettingsGetAccessibleGmbAccountsResponse Source #

Instances
Eq LiaSettingsGetAccessibleGmbAccountsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsGetAccessibleGmbAccountsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettingsGetAccessibleGmbAccountsResponse -> c LiaSettingsGetAccessibleGmbAccountsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettingsGetAccessibleGmbAccountsResponse #

toConstr :: LiaSettingsGetAccessibleGmbAccountsResponse -> Constr #

dataTypeOf :: LiaSettingsGetAccessibleGmbAccountsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettingsGetAccessibleGmbAccountsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettingsGetAccessibleGmbAccountsResponse) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettingsGetAccessibleGmbAccountsResponse -> LiaSettingsGetAccessibleGmbAccountsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsGetAccessibleGmbAccountsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsGetAccessibleGmbAccountsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettingsGetAccessibleGmbAccountsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettingsGetAccessibleGmbAccountsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettingsGetAccessibleGmbAccountsResponse -> m LiaSettingsGetAccessibleGmbAccountsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsGetAccessibleGmbAccountsResponse -> m LiaSettingsGetAccessibleGmbAccountsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsGetAccessibleGmbAccountsResponse -> m LiaSettingsGetAccessibleGmbAccountsResponse #

Show LiaSettingsGetAccessibleGmbAccountsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsGetAccessibleGmbAccountsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON LiaSettingsGetAccessibleGmbAccountsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsGetAccessibleGmbAccountsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsGetAccessibleGmbAccountsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsGetAccessibleGmbAccountsResponse = D1 (MetaData "LiaSettingsGetAccessibleGmbAccountsResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaSettingsGetAccessibleGmbAccountsResponse'" PrefixI True) (S1 (MetaSel (Just "_lsgagarGmbAccounts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GmbAccountsGmbAccount])) :*: (S1 (MetaSel (Just "_lsgagarKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_lsgagarAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))))))

liaSettingsGetAccessibleGmbAccountsResponse :: LiaSettingsGetAccessibleGmbAccountsResponse Source #

Creates a value of LiaSettingsGetAccessibleGmbAccountsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lsgagarGmbAccounts :: Lens' LiaSettingsGetAccessibleGmbAccountsResponse [GmbAccountsGmbAccount] Source #

A list of GMB accounts which are available to the merchant.

lsgagarKind :: Lens' LiaSettingsGetAccessibleGmbAccountsResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsGetAccessibleGmbAccountsResponse".

DatafeedsListResponse

data DatafeedsListResponse Source #

Instances
Eq DatafeedsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedsListResponse -> c DatafeedsListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedsListResponse #

toConstr :: DatafeedsListResponse -> Constr #

dataTypeOf :: DatafeedsListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedsListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedsListResponse) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedsListResponse -> DatafeedsListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedsListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedsListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedsListResponse -> m DatafeedsListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsListResponse -> m DatafeedsListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsListResponse -> m DatafeedsListResponse #

Show DatafeedsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedsListResponse :: Type -> Type #

ToJSON DatafeedsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsListResponse = D1 (MetaData "DatafeedsListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedsListResponse'" PrefixI True) (S1 (MetaSel (Just "_dlrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dlrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_dlrResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Datafeed])))))

datafeedsListResponse :: DatafeedsListResponse Source #

Creates a value of DatafeedsListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dlrNextPageToken :: Lens' DatafeedsListResponse (Maybe Text) Source #

The token for the retrieval of the next page of datafeeds.

dlrKind :: Lens' DatafeedsListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#datafeedsListResponse".

AccountStatusStatistics

data AccountStatusStatistics Source #

Instances
Eq AccountStatusStatistics Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountStatusStatistics Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountStatusStatistics -> c AccountStatusStatistics #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountStatusStatistics #

toConstr :: AccountStatusStatistics -> Constr #

dataTypeOf :: AccountStatusStatistics -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountStatusStatistics) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountStatusStatistics) #

gmapT :: (forall b. Data b => b -> b) -> AccountStatusStatistics -> AccountStatusStatistics #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountStatusStatistics -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountStatusStatistics -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountStatusStatistics -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountStatusStatistics -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountStatusStatistics -> m AccountStatusStatistics #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountStatusStatistics -> m AccountStatusStatistics #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountStatusStatistics -> m AccountStatusStatistics #

Show AccountStatusStatistics Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountStatusStatistics Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountStatusStatistics :: Type -> Type #

ToJSON AccountStatusStatistics Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountStatusStatistics Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatusStatistics Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountStatusStatistics = D1 (MetaData "AccountStatusStatistics" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountStatusStatistics'" PrefixI True) ((S1 (MetaSel (Just "_assPending") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_assExpiring") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_assActive") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_assDisApproved") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

accountStatusStatistics :: AccountStatusStatistics Source #

Creates a value of AccountStatusStatistics with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

assDisApproved :: Lens' AccountStatusStatistics (Maybe Int64) Source #

Number of disapproved offers.

ProductsCustomBatchResponseEntry

data ProductsCustomBatchResponseEntry Source #

A batch entry encoding a single non-batch products response.

See: productsCustomBatchResponseEntry smart constructor.

Instances
Eq ProductsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductsCustomBatchResponseEntry -> c ProductsCustomBatchResponseEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductsCustomBatchResponseEntry #

toConstr :: ProductsCustomBatchResponseEntry -> Constr #

dataTypeOf :: ProductsCustomBatchResponseEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductsCustomBatchResponseEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductsCustomBatchResponseEntry) #

gmapT :: (forall b. Data b => b -> b) -> ProductsCustomBatchResponseEntry -> ProductsCustomBatchResponseEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductsCustomBatchResponseEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductsCustomBatchResponseEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductsCustomBatchResponseEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductsCustomBatchResponseEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductsCustomBatchResponseEntry -> m ProductsCustomBatchResponseEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductsCustomBatchResponseEntry -> m ProductsCustomBatchResponseEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductsCustomBatchResponseEntry -> m ProductsCustomBatchResponseEntry #

Show ProductsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductsCustomBatchResponseEntry :: Type -> Type #

ToJSON ProductsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsCustomBatchResponseEntry = D1 (MetaData "ProductsCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductsCustomBatchResponseEntry'" PrefixI True) ((S1 (MetaSel (Just "_pcbre1Kind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_pcbre1Product") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Product))) :*: (S1 (MetaSel (Just "_pcbre1Errors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: S1 (MetaSel (Just "_pcbre1BatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

productsCustomBatchResponseEntry :: ProductsCustomBatchResponseEntry Source #

Creates a value of ProductsCustomBatchResponseEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pcbre1Kind :: Lens' ProductsCustomBatchResponseEntry Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#productsCustomBatchResponseEntry".

pcbre1Product :: Lens' ProductsCustomBatchResponseEntry (Maybe Product) Source #

The inserted product. Only defined if the method is insert and if the request was successful.

pcbre1Errors :: Lens' ProductsCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if and only if the request failed.

pcbre1BatchId :: Lens' ProductsCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry this entry responds to.

Product

data Product Source #

Product data. After inserting, updating, or deleting a product, it may take several minutes before changes take effect.

See: product smart constructor.

Instances
Eq Product Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Product -> Product -> Bool #

(/=) :: Product -> Product -> Bool #

Data Product Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Product -> c Product #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Product #

toConstr :: Product -> Constr #

dataTypeOf :: Product -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Product) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Product) #

gmapT :: (forall b. Data b => b -> b) -> Product -> Product #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Product -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Product -> r #

gmapQ :: (forall d. Data d => d -> u) -> Product -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Product -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Product -> m Product #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Product -> m Product #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Product -> m Product #

Show Product Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Product Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Product :: Type -> Type #

Methods

from :: Product -> Rep Product x #

to :: Rep Product x -> Product #

ToJSON Product Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Product Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Product Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Product = D1 (MetaData "Product" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Product'" PrefixI True) ((((((S1 (MetaSel (Just "_prorDisplayAdsLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorCustomLabel1") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorShippingWidth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ProductShippingDimension)) :*: S1 (MetaSel (Just "_prorImageLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_prorIncludedDestinations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_prorDisplayAdsValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) :*: (S1 (MetaSel (Just "_prorLoyaltyPoints") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LoyaltyPoints)) :*: (S1 (MetaSel (Just "_prorAdditionalImageLinks") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_prorExcludedDestinations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))) :*: (((S1 (MetaSel (Just "_prorColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorCustomLabel0") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_prorMinHandlingTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) :*: ((S1 (MetaSel (Just "_prorMultipack") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_prorPattern") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_prorProductTypes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_prorSizeSystem") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))) :*: ((((S1 (MetaSel (Just "_prorUnitPricingBaseMeasure") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ProductUnitPricingBaseMeasure)) :*: S1 (MetaSel (Just "_prorTaxes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ProductTax]))) :*: (S1 (MetaSel (Just "_prorMaterial") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorInstallment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Installment)))) :*: ((S1 (MetaSel (Just "_prorChannel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorIdentifierExists") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_prorBrand") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_prorUnitPricingMeasure") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ProductUnitPricingMeasure)) :*: S1 (MetaSel (Just "_prorSalePrice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)))))) :*: (((S1 (MetaSel (Just "_prorCostOfGoodsSold") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_prorShippingLength") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ProductShippingDimension))) :*: (S1 (MetaSel (Just "_prorCustomLabel3") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorMaxHandlingTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) :*: ((S1 (MetaSel (Just "_prorAvailability") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorMinEnergyEfficiencyClass") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorTargetCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_prorShippingLabel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorAdsRedirect") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))) :*: (((((S1 (MetaSel (Just "_prorCustomAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [CustomAttribute])) :*: S1 (MetaSel (Just "_prorGtin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorAgeGroup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorDisplayAdsTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_prorMaxEnergyEfficiencyClass") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorGender") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorExpirationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_prorItemGroupId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorSalePriceEffectiveDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) :*: (((S1 (MetaSel (Just "_prorCustomLabel2") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorGoogleProductCategory") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorShipping") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ProductShipping])) :*: S1 (MetaSel (Just "_prorShippingWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ProductShippingWeight)))) :*: ((S1 (MetaSel (Just "_prorSellOnGoogleQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_prorShippingHeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ProductShippingDimension))) :*: (S1 (MetaSel (Just "_prorAvailabilityDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_prorSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorOfferId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))) :*: ((((S1 (MetaSel (Just "_prorId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorPrice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))) :*: (S1 (MetaSel (Just "_prorPromotionIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_prorSizeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_prorMobileLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorAdult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_prorContentLanguage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorAdsLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))) :*: (((S1 (MetaSel (Just "_prorEnergyEfficiencyClass") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorDisplayAdsSimilarIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_prorMpn") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_prorCondition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorSizes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))) :*: ((S1 (MetaSel (Just "_prorIsBundle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_prorDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_prorCustomLabel4") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_prorDisplayAdsId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prorAdsGrouping") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))))

prorDisplayAdsLink :: Lens' Product (Maybe Text) Source #

URL directly to your item's landing page for dynamic remarketing campaigns.

prorCustomLabel1 :: Lens' Product (Maybe Text) Source #

Custom label 1 for custom grouping of items in a Shopping campaign.

prorImageLink :: Lens' Product (Maybe Text) Source #

URL of an image of the item.

prorIncludedDestinations :: Lens' Product [Text] Source #

The list of destinations to include for this target (corresponds to checked check boxes in Merchant Center). Default destinations are always included unless provided in the excluded_destination field.

prorDisplayAdsValue :: Lens' Product (Maybe Double) Source #

Offer margin for dynamic remarketing campaigns.

prorLoyaltyPoints :: Lens' Product (Maybe LoyaltyPoints) Source #

Loyalty points that users receive after purchasing the item. Japan only.

prorAdditionalImageLinks :: Lens' Product [Text] Source #

Additional URLs of images of the item.

prorExcludedDestinations :: Lens' Product [Text] Source #

The list of destinations to exclude for this target (corresponds to unchecked check boxes in Merchant Center).

prorColor :: Lens' Product (Maybe Text) Source #

Color of the item.

prorCustomLabel0 :: Lens' Product (Maybe Text) Source #

Custom label 0 for custom grouping of items in a Shopping campaign.

prorKind :: Lens' Product Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#product".

prorMinHandlingTime :: Lens' Product (Maybe Int64) Source #

Minimal product handling time (in business days).

prorMultipack :: Lens' Product (Maybe Int64) Source #

The number of identical products in a merchant-defined multipack.

prorPattern :: Lens' Product (Maybe Text) Source #

The item's pattern (e.g. polka dots).

prorLink :: Lens' Product (Maybe Text) Source #

URL directly linking to your item's page on your website.

prorProductTypes :: Lens' Product [Text] Source #

Categories of the item (formatted as in products feed specification).

prorSizeSystem :: Lens' Product (Maybe Text) Source #

System in which the size is specified. Recommended for apparel items.

prorUnitPricingBaseMeasure :: Lens' Product (Maybe ProductUnitPricingBaseMeasure) Source #

The preference of the denominator of the unit price.

prorTaxes :: Lens' Product [ProductTax] Source #

Tax information.

prorMaterial :: Lens' Product (Maybe Text) Source #

The material of which the item is made.

prorInstallment :: Lens' Product (Maybe Installment) Source #

Number and amount of installments to pay for an item. Brazil only.

prorChannel :: Lens' Product (Maybe Text) Source #

The item's channel (online or local).

prorIdentifierExists :: Lens' Product (Maybe Bool) Source #

False when the item does not have unique product identifiers appropriate to its category, such as GTIN, MPN, and brand. Required according to the Unique Product Identifier Rules for all target countries except for Canada.

prorBrand :: Lens' Product (Maybe Text) Source #

Brand of the item.

prorUnitPricingMeasure :: Lens' Product (Maybe ProductUnitPricingMeasure) Source #

The measure and dimension of an item.

prorSalePrice :: Lens' Product (Maybe Price) Source #

Advertised sale price of the item.

prorCostOfGoodsSold :: Lens' Product (Maybe Price) Source #

Cost of goods sold. Used for gross profit reporting.

prorCustomLabel3 :: Lens' Product (Maybe Text) Source #

Custom label 3 for custom grouping of items in a Shopping campaign.

prorMaxHandlingTime :: Lens' Product (Maybe Int64) Source #

Maximal product handling time (in business days).

prorAvailability :: Lens' Product (Maybe Text) Source #

Availability status of the item.

prorMinEnergyEfficiencyClass :: Lens' Product (Maybe Text) Source #

The energy efficiency class as defined in EU directive 2010/30/EU.

prorTargetCountry :: Lens' Product (Maybe Text) Source #

The CLDR territory code for the item.

prorShippingLabel :: Lens' Product (Maybe Text) Source #

The shipping label of the product, used to group product in account-level shipping rules.

prorAdsRedirect :: Lens' Product (Maybe Text) Source #

Allows advertisers to override the item URL when the product is shown within the context of Product Ads.

prorCustomAttributes :: Lens' Product [CustomAttribute] Source #

A list of custom (merchant-provided) attributes. It can also be used for submitting any attribute of the feed specification in its generic form (e.g., { "name": "size type", "type": "text", "value": "regular" }). This is useful for submitting attributes not explicitly exposed by the API.

prorGtin :: Lens' Product (Maybe Text) Source #

Global Trade Item Number (GTIN) of the item.

prorAgeGroup :: Lens' Product (Maybe Text) Source #

Target age group of the item.

prorDisplayAdsTitle :: Lens' Product (Maybe Text) Source #

Title of an item for dynamic remarketing campaigns.

prorMaxEnergyEfficiencyClass :: Lens' Product (Maybe Text) Source #

The energy efficiency class as defined in EU directive 2010/30/EU.

prorGender :: Lens' Product (Maybe Text) Source #

Target gender of the item.

prorExpirationDate :: Lens' Product (Maybe Text) Source #

Date on which the item should expire, as specified upon insertion, in ISO 8601 format. The actual expiration date in Google Shopping is exposed in productstatuses as googleExpirationDate and might be earlier if expirationDate is too far in the future.

prorItemGroupId :: Lens' Product (Maybe Text) Source #

Shared identifier for all variants of the same product.

prorSalePriceEffectiveDate :: Lens' Product (Maybe Text) Source #

Date range during which the item is on sale (see products feed specification).

prorCustomLabel2 :: Lens' Product (Maybe Text) Source #

Custom label 2 for custom grouping of items in a Shopping campaign.

prorGoogleProductCategory :: Lens' Product (Maybe Text) Source #

Google's category of the item (see Google product taxonomy).

prorShippingWeight :: Lens' Product (Maybe ProductShippingWeight) Source #

Weight of the item for shipping.

prorSellOnGoogleQuantity :: Lens' Product (Maybe Int64) Source #

The quantity of the product that is available for selling on Google. Supported only for online products.

prorAvailabilityDate :: Lens' Product (Maybe Text) Source #

The day a pre-ordered product becomes available for delivery, in ISO 8601 format.

prorSource :: Lens' Product (Maybe Text) Source #

The source of the offer, i.e., how the offer was created.

prorOfferId :: Lens' Product (Maybe Text) Source #

A unique identifier for the item. Leading and trailing whitespaces are stripped and multiple whitespaces are replaced by a single whitespace upon submission. Only valid unicode characters are accepted. See the products feed specification for details. Note: Content API methods that operate on products take the REST id of the product, not this identifier.

prorId :: Lens' Product (Maybe Text) Source #

The REST id of the product. Content API methods that operate on products take this as their productId parameter. The REST id for a product is of the form channel:contentLanguage:targetCountry:offerId.

prorPrice :: Lens' Product (Maybe Price) Source #

Price of the item.

prorPromotionIds :: Lens' Product [Text] Source #

The unique ID of a promotion.

prorSizeType :: Lens' Product (Maybe Text) Source #

The cut of the item. Recommended for apparel items.

prorMobileLink :: Lens' Product (Maybe Text) Source #

Link to a mobile-optimized version of the landing page.

prorTitle :: Lens' Product (Maybe Text) Source #

Title of the item.

prorAdult :: Lens' Product (Maybe Bool) Source #

Set to true if the item is targeted towards adults.

prorContentLanguage :: Lens' Product (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

prorAdsLabels :: Lens' Product [Text] Source #

Similar to ads_grouping, but only works on CPC.

prorEnergyEfficiencyClass :: Lens' Product (Maybe Text) Source #

The energy efficiency class as defined in EU directive 2010/30/EU.

prorDisplayAdsSimilarIds :: Lens' Product [Text] Source #

Advertiser-specified recommendations.

prorMpn :: Lens' Product (Maybe Text) Source #

Manufacturer Part Number (MPN) of the item.

prorCondition :: Lens' Product (Maybe Text) Source #

Condition or state of the item.

prorSizes :: Lens' Product [Text] Source #

Size of the item.

prorIsBundle :: Lens' Product (Maybe Bool) Source #

Whether the item is a merchant-defined bundle. A bundle is a custom grouping of different products sold by a merchant for a single price.

prorDescription :: Lens' Product (Maybe Text) Source #

Description of the item.

prorCustomLabel4 :: Lens' Product (Maybe Text) Source #

Custom label 4 for custom grouping of items in a Shopping campaign.

prorDisplayAdsId :: Lens' Product (Maybe Text) Source #

An identifier for an item for dynamic remarketing campaigns.

prorAdsGrouping :: Lens' Product (Maybe Text) Source #

Used to group items in an arbitrary way. Only for CPA%, discouraged otherwise.

LiaSettingsCustomBatchRequestEntry

data LiaSettingsCustomBatchRequestEntry Source #

Instances
Eq LiaSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettingsCustomBatchRequestEntry -> c LiaSettingsCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettingsCustomBatchRequestEntry #

toConstr :: LiaSettingsCustomBatchRequestEntry -> Constr #

dataTypeOf :: LiaSettingsCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettingsCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettingsCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettingsCustomBatchRequestEntry -> LiaSettingsCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettingsCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettingsCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchRequestEntry -> m LiaSettingsCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchRequestEntry -> m LiaSettingsCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsCustomBatchRequestEntry -> m LiaSettingsCustomBatchRequestEntry #

Show LiaSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaSettingsCustomBatchRequestEntry :: Type -> Type #

ToJSON LiaSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsCustomBatchRequestEntry = D1 (MetaData "LiaSettingsCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaSettingsCustomBatchRequestEntry'" PrefixI True) (((S1 (MetaSel (Just "_lGmbEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lContactEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_lMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_lCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lLiaSettings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LiaSettings))))) :*: ((S1 (MetaSel (Just "_lAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_lMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lContactName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_lPosExternalAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_lPosDataProviderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_lBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))))

lGmbEmail :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe Text) Source #

The GMB account. Required only for RequestGmbAccess.

lContactEmail :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe Text) Source #

Inventory validation contact email. Required only for SetInventoryValidationContact.

lCountry :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe Text) Source #

The country code. Required only for RequestInventoryVerification.

lLiaSettings :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe LiaSettings) Source #

The account Lia settings to update. Only defined if the method is update.

lAccountId :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe Word64) Source #

The ID of the account for which to get/update account shipping settings.

lContactName :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe Text) Source #

Inventory validation contact name. Required only for SetInventoryValidationContact.

lPosExternalAccountId :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe Text) Source #

The account ID by which this merchant is known to the POS provider.

lPosDataProviderId :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe Word64) Source #

The ID of POS data provider. Required only for SetPosProvider.

lBatchId :: Lens' LiaSettingsCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

Errors

data Errors Source #

A list of errors returned by a failed batch entry.

See: errors smart constructor.

Instances
Eq Errors Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Errors -> Errors -> Bool #

(/=) :: Errors -> Errors -> Bool #

Data Errors Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Errors -> c Errors #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Errors #

toConstr :: Errors -> Constr #

dataTypeOf :: Errors -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Errors) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Errors) #

gmapT :: (forall b. Data b => b -> b) -> Errors -> Errors #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Errors -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Errors -> r #

gmapQ :: (forall d. Data d => d -> u) -> Errors -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Errors -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Errors -> m Errors #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Errors -> m Errors #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Errors -> m Errors #

Show Errors Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Errors Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Errors :: Type -> Type #

Methods

from :: Errors -> Rep Errors x #

to :: Rep Errors x -> Errors #

ToJSON Errors Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Errors Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Errors Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Errors = D1 (MetaData "Errors" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Errors'" PrefixI True) (S1 (MetaSel (Just "_errCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: (S1 (MetaSel (Just "_errMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_errErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Error'])))))

errors :: Errors Source #

Creates a value of Errors with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

errCode :: Lens' Errors (Maybe Word32) Source #

The HTTP status of the first error in errors.

errMessage :: Lens' Errors (Maybe Text) Source #

The message of the first error in errors.

errErrors :: Lens' Errors [Error'] Source #

A list of errors.

LiaInventorySettings

data LiaInventorySettings Source #

Instances
Eq LiaInventorySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaInventorySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaInventorySettings -> c LiaInventorySettings #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaInventorySettings #

toConstr :: LiaInventorySettings -> Constr #

dataTypeOf :: LiaInventorySettings -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaInventorySettings) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaInventorySettings) #

gmapT :: (forall b. Data b => b -> b) -> LiaInventorySettings -> LiaInventorySettings #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaInventorySettings -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaInventorySettings -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaInventorySettings -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaInventorySettings -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaInventorySettings -> m LiaInventorySettings #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaInventorySettings -> m LiaInventorySettings #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaInventorySettings -> m LiaInventorySettings #

Show LiaInventorySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaInventorySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep LiaInventorySettings :: Type -> Type #

ToJSON LiaInventorySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaInventorySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaInventorySettings Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaInventorySettings = D1 (MetaData "LiaInventorySettings" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaInventorySettings'" PrefixI True) ((S1 (MetaSel (Just "_lisInventoryVerificationContactName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lisStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_lisInventoryVerificationContactEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lisInventoryVerificationContactStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

liaInventorySettings :: LiaInventorySettings Source #

Creates a value of LiaInventorySettings with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lisInventoryVerificationContactName :: Lens' LiaInventorySettings (Maybe Text) Source #

The name of the contact for the inventory verification process.

lisStatus :: Lens' LiaInventorySettings (Maybe Text) Source #

The status of the inventory verification process.

lisInventoryVerificationContactEmail :: Lens' LiaInventorySettings (Maybe Text) Source #

The email of the contact for the inventory verification process.

AccountstatusesCustomBatchResponseEntry

data AccountstatusesCustomBatchResponseEntry Source #

A batch entry encoding a single non-batch accountstatuses response.

See: accountstatusesCustomBatchResponseEntry smart constructor.

Instances
Eq AccountstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountstatusesCustomBatchResponseEntry -> c AccountstatusesCustomBatchResponseEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountstatusesCustomBatchResponseEntry #

toConstr :: AccountstatusesCustomBatchResponseEntry -> Constr #

dataTypeOf :: AccountstatusesCustomBatchResponseEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountstatusesCustomBatchResponseEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountstatusesCustomBatchResponseEntry) #

gmapT :: (forall b. Data b => b -> b) -> AccountstatusesCustomBatchResponseEntry -> AccountstatusesCustomBatchResponseEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountstatusesCustomBatchResponseEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountstatusesCustomBatchResponseEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountstatusesCustomBatchResponseEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountstatusesCustomBatchResponseEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchResponseEntry -> m AccountstatusesCustomBatchResponseEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchResponseEntry -> m AccountstatusesCustomBatchResponseEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountstatusesCustomBatchResponseEntry -> m AccountstatusesCustomBatchResponseEntry #

Show AccountstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON AccountstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountstatusesCustomBatchResponseEntry = D1 (MetaData "AccountstatusesCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountstatusesCustomBatchResponseEntry'" PrefixI True) (S1 (MetaSel (Just "_aaAccountStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AccountStatus)) :*: (S1 (MetaSel (Just "_aaErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: S1 (MetaSel (Just "_aaBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

accountstatusesCustomBatchResponseEntry :: AccountstatusesCustomBatchResponseEntry Source #

Creates a value of AccountstatusesCustomBatchResponseEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aaAccountStatus :: Lens' AccountstatusesCustomBatchResponseEntry (Maybe AccountStatus) Source #

The requested account status. Defined if and only if the request was successful.

aaErrors :: Lens' AccountstatusesCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if and only if the request failed.

aaBatchId :: Lens' AccountstatusesCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry this entry responds to.

OrdersCancelLineItemResponse

data OrdersCancelLineItemResponse Source #

Instances
Eq OrdersCancelLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCancelLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCancelLineItemResponse -> c OrdersCancelLineItemResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCancelLineItemResponse #

toConstr :: OrdersCancelLineItemResponse -> Constr #

dataTypeOf :: OrdersCancelLineItemResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCancelLineItemResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCancelLineItemResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCancelLineItemResponse -> OrdersCancelLineItemResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelLineItemResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCancelLineItemResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCancelLineItemResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCancelLineItemResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCancelLineItemResponse -> m OrdersCancelLineItemResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelLineItemResponse -> m OrdersCancelLineItemResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCancelLineItemResponse -> m OrdersCancelLineItemResponse #

Show OrdersCancelLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCancelLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersCancelLineItemResponse :: Type -> Type #

ToJSON OrdersCancelLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCancelLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelLineItemResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCancelLineItemResponse = D1 (MetaData "OrdersCancelLineItemResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCancelLineItemResponse'" PrefixI True) (S1 (MetaSel (Just "_oclirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oclirExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersCancelLineItemResponse :: OrdersCancelLineItemResponse Source #

Creates a value of OrdersCancelLineItemResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oclirKind :: Lens' OrdersCancelLineItemResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersCancelLineItemResponse".

HolidayCutoff

data HolidayCutoff Source #

Instances
Eq HolidayCutoff Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data HolidayCutoff Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HolidayCutoff -> c HolidayCutoff #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HolidayCutoff #

toConstr :: HolidayCutoff -> Constr #

dataTypeOf :: HolidayCutoff -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HolidayCutoff) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HolidayCutoff) #

gmapT :: (forall b. Data b => b -> b) -> HolidayCutoff -> HolidayCutoff #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HolidayCutoff -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HolidayCutoff -> r #

gmapQ :: (forall d. Data d => d -> u) -> HolidayCutoff -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HolidayCutoff -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HolidayCutoff -> m HolidayCutoff #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HolidayCutoff -> m HolidayCutoff #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HolidayCutoff -> m HolidayCutoff #

Show HolidayCutoff Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic HolidayCutoff Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep HolidayCutoff :: Type -> Type #

ToJSON HolidayCutoff Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON HolidayCutoff Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep HolidayCutoff Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep HolidayCutoff = D1 (MetaData "HolidayCutoff" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "HolidayCutoff'" PrefixI True) ((S1 (MetaSel (Just "_hcDeadlineHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_hcDeadlineTimezone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_hcVisibleFromDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_hcHolidayId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_hcDeadlineDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

holidayCutoff :: HolidayCutoff Source #

Creates a value of HolidayCutoff with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

hcDeadlineHour :: Lens' HolidayCutoff (Maybe Word32) Source #

Hour of the day on the deadline date until which the order has to be placed to qualify for the delivery guarantee. Possible values are: 0 (midnight), 1, ..., 12 (noon), 13, ..., 23. Required.

hcDeadlineTimezone :: Lens' HolidayCutoff (Maybe Text) Source #

Timezone identifier for the deadline hour. A list of identifiers can be found in the AdWords API documentation. E.g. "Europe/Zurich". Required.

hcVisibleFromDate :: Lens' HolidayCutoff (Maybe Text) Source #

Date on which the deadline will become visible to consumers in ISO 8601 format. E.g. "2016-10-31" for 31st October 2016. Required.

hcHolidayId :: Lens' HolidayCutoff (Maybe Text) Source #

Unique identifier for the holiday. Required.

hcDeadlineDate :: Lens' HolidayCutoff (Maybe Text) Source #

Date of the order deadline, in ISO 8601 format. E.g. "2016-11-29" for 29th November 2016. Required.

TestOrderLineItem

data TestOrderLineItem Source #

Instances
Eq TestOrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data TestOrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestOrderLineItem -> c TestOrderLineItem #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestOrderLineItem #

toConstr :: TestOrderLineItem -> Constr #

dataTypeOf :: TestOrderLineItem -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestOrderLineItem) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestOrderLineItem) #

gmapT :: (forall b. Data b => b -> b) -> TestOrderLineItem -> TestOrderLineItem #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestOrderLineItem -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestOrderLineItem -> r #

gmapQ :: (forall d. Data d => d -> u) -> TestOrderLineItem -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TestOrderLineItem -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestOrderLineItem -> m TestOrderLineItem #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestOrderLineItem -> m TestOrderLineItem #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestOrderLineItem -> m TestOrderLineItem #

Show TestOrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic TestOrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep TestOrderLineItem :: Type -> Type #

ToJSON TestOrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON TestOrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrderLineItem Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep TestOrderLineItem = D1 (MetaData "TestOrderLineItem" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "TestOrderLineItem'" PrefixI True) ((S1 (MetaSel (Just "_toliQuantityOrdered") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_toliReturnInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderLineItemReturnInfo))) :*: (S1 (MetaSel (Just "_toliShippingDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderLineItemShippingDetails)) :*: (S1 (MetaSel (Just "_toliProduct") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TestOrderLineItemProduct)) :*: S1 (MetaSel (Just "_toliUnitTax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))))))

testOrderLineItem :: TestOrderLineItem Source #

Creates a value of TestOrderLineItem with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

toliReturnInfo :: Lens' TestOrderLineItem (Maybe OrderLineItemReturnInfo) Source #

Details of the return policy for the line item.

toliShippingDetails :: Lens' TestOrderLineItem (Maybe OrderLineItemShippingDetails) Source #

Details of the requested shipping for the line item.

toliProduct :: Lens' TestOrderLineItem (Maybe TestOrderLineItemProduct) Source #

Product data from the time of the order placement.

toliUnitTax :: Lens' TestOrderLineItem (Maybe Price) Source #

Unit tax for the line item.

ProductstatusesCustomBatchRequestEntry

data ProductstatusesCustomBatchRequestEntry Source #

A batch entry encoding a single non-batch productstatuses request.

See: productstatusesCustomBatchRequestEntry smart constructor.

Instances
Eq ProductstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductstatusesCustomBatchRequestEntry -> c ProductstatusesCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductstatusesCustomBatchRequestEntry #

toConstr :: ProductstatusesCustomBatchRequestEntry -> Constr #

dataTypeOf :: ProductstatusesCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductstatusesCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductstatusesCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> ProductstatusesCustomBatchRequestEntry -> ProductstatusesCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductstatusesCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductstatusesCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductstatusesCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductstatusesCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchRequestEntry -> m ProductstatusesCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchRequestEntry -> m ProductstatusesCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductstatusesCustomBatchRequestEntry -> m ProductstatusesCustomBatchRequestEntry #

Show ProductstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON ProductstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductstatusesCustomBatchRequestEntry = D1 (MetaData "ProductstatusesCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductstatusesCustomBatchRequestEntry'" PrefixI True) ((S1 (MetaSel (Just "_p2MerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_p2Destinations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_p2Method") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_p2IncludeAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_p2ProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_p2BatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

productstatusesCustomBatchRequestEntry :: ProductstatusesCustomBatchRequestEntry Source #

Creates a value of ProductstatusesCustomBatchRequestEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

p2Destinations :: Lens' ProductstatusesCustomBatchRequestEntry [Text] Source #

If set, only issues for the specified destinations are returned, otherwise only issues for the Shopping destination.

p2ProductId :: Lens' ProductstatusesCustomBatchRequestEntry (Maybe Text) Source #

The ID of the product whose status to get.

p2BatchId :: Lens' ProductstatusesCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

ShippingSettingsCustomBatchResponse

data ShippingSettingsCustomBatchResponse Source #

Instances
Eq ShippingSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShippingSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShippingSettingsCustomBatchResponse -> c ShippingSettingsCustomBatchResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShippingSettingsCustomBatchResponse #

toConstr :: ShippingSettingsCustomBatchResponse -> Constr #

dataTypeOf :: ShippingSettingsCustomBatchResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShippingSettingsCustomBatchResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShippingSettingsCustomBatchResponse) #

gmapT :: (forall b. Data b => b -> b) -> ShippingSettingsCustomBatchResponse -> ShippingSettingsCustomBatchResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsCustomBatchResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShippingSettingsCustomBatchResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShippingSettingsCustomBatchResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShippingSettingsCustomBatchResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchResponse -> m ShippingSettingsCustomBatchResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchResponse -> m ShippingSettingsCustomBatchResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShippingSettingsCustomBatchResponse -> m ShippingSettingsCustomBatchResponse #

Show ShippingSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShippingSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON ShippingSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShippingSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsCustomBatchResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShippingSettingsCustomBatchResponse = D1 (MetaData "ShippingSettingsCustomBatchResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShippingSettingsCustomBatchResponse'" PrefixI True) (S1 (MetaSel (Just "_shiEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ShippingSettingsCustomBatchResponseEntry])) :*: S1 (MetaSel (Just "_shiKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

shippingSettingsCustomBatchResponse :: ShippingSettingsCustomBatchResponse Source #

Creates a value of ShippingSettingsCustomBatchResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

shiKind :: Lens' ShippingSettingsCustomBatchResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#shippingsettingsCustomBatchResponse".

OrdersReturnRefundLineItemRequest

data OrdersReturnRefundLineItemRequest Source #

Instances
Eq OrdersReturnRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersReturnRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersReturnRefundLineItemRequest -> c OrdersReturnRefundLineItemRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersReturnRefundLineItemRequest #

toConstr :: OrdersReturnRefundLineItemRequest -> Constr #

dataTypeOf :: OrdersReturnRefundLineItemRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersReturnRefundLineItemRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersReturnRefundLineItemRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersReturnRefundLineItemRequest -> OrdersReturnRefundLineItemRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersReturnRefundLineItemRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersReturnRefundLineItemRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersReturnRefundLineItemRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersReturnRefundLineItemRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersReturnRefundLineItemRequest -> m OrdersReturnRefundLineItemRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersReturnRefundLineItemRequest -> m OrdersReturnRefundLineItemRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersReturnRefundLineItemRequest -> m OrdersReturnRefundLineItemRequest #

Show OrdersReturnRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersReturnRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersReturnRefundLineItemRequest :: Type -> Type #

ToJSON OrdersReturnRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersReturnRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersReturnRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersReturnRefundLineItemRequest = D1 (MetaData "OrdersReturnRefundLineItemRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersReturnRefundLineItemRequest'" PrefixI True) (((S1 (MetaSel (Just "_orrlirrQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_orrlirrLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_orrlirrReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_orrlirrOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_orrlirrProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_orrlirrTaxAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))) :*: (S1 (MetaSel (Just "_orrlirrPriceAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_orrlirrReasonText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

orrlirrLineItemId :: Lens' OrdersReturnRefundLineItemRequest (Maybe Text) Source #

The ID of the line item to return. Either lineItemId or productId is required.

orrlirrOperationId :: Lens' OrdersReturnRefundLineItemRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

orrlirrProductId :: Lens' OrdersReturnRefundLineItemRequest (Maybe Text) Source #

The ID of the product to return. This is the REST ID used in the products service. Either lineItemId or productId is required.

orrlirrPriceAmount :: Lens' OrdersReturnRefundLineItemRequest (Maybe Price) Source #

The amount to be refunded. This may be pre-tax or post-tax depending on the location of the order. If omitted, refundless return is assumed. Optional, but if filled then both priceAmount and taxAmount must be set.

ShipmentInvoiceLineItemInvoice

data ShipmentInvoiceLineItemInvoice Source #

Instances
Eq ShipmentInvoiceLineItemInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShipmentInvoiceLineItemInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShipmentInvoiceLineItemInvoice -> c ShipmentInvoiceLineItemInvoice #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShipmentInvoiceLineItemInvoice #

toConstr :: ShipmentInvoiceLineItemInvoice -> Constr #

dataTypeOf :: ShipmentInvoiceLineItemInvoice -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShipmentInvoiceLineItemInvoice) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShipmentInvoiceLineItemInvoice) #

gmapT :: (forall b. Data b => b -> b) -> ShipmentInvoiceLineItemInvoice -> ShipmentInvoiceLineItemInvoice #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShipmentInvoiceLineItemInvoice -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShipmentInvoiceLineItemInvoice -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShipmentInvoiceLineItemInvoice -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShipmentInvoiceLineItemInvoice -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShipmentInvoiceLineItemInvoice -> m ShipmentInvoiceLineItemInvoice #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShipmentInvoiceLineItemInvoice -> m ShipmentInvoiceLineItemInvoice #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShipmentInvoiceLineItemInvoice -> m ShipmentInvoiceLineItemInvoice #

Show ShipmentInvoiceLineItemInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShipmentInvoiceLineItemInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ShipmentInvoiceLineItemInvoice :: Type -> Type #

ToJSON ShipmentInvoiceLineItemInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShipmentInvoiceLineItemInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShipmentInvoiceLineItemInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShipmentInvoiceLineItemInvoice = D1 (MetaData "ShipmentInvoiceLineItemInvoice" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShipmentInvoiceLineItemInvoice'" PrefixI True) ((S1 (MetaSel (Just "_siliiUnitInvoice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UnitInvoice)) :*: S1 (MetaSel (Just "_siliiShipmentUnitIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_siliiLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_siliiProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

shipmentInvoiceLineItemInvoice :: ShipmentInvoiceLineItemInvoice Source #

Creates a value of ShipmentInvoiceLineItemInvoice with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

siliiUnitInvoice :: Lens' ShipmentInvoiceLineItemInvoice (Maybe UnitInvoice) Source #

required
Invoice details for a single unit.

siliiShipmentUnitIds :: Lens' ShipmentInvoiceLineItemInvoice [Text] Source #

required
Unit IDs to define specific units within the line item.

siliiLineItemId :: Lens' ShipmentInvoiceLineItemInvoice (Maybe Text) Source #

ID of the line item. Either lineItemId or productId must be set.

siliiProductId :: Lens' ShipmentInvoiceLineItemInvoice (Maybe Text) Source #

ID of the product. This is the REST ID used in the products service. Either lineItemId or productId must be set.

OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo

data OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo Source #

Instances
Eq OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> c OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo #

toConstr :: OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> Constr #

dataTypeOf :: OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo) #

gmapT :: (forall b. Data b => b -> b) -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> m OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> m OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo -> m OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo #

Show OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo = D1 (MetaData "OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo'" PrefixI True) (S1 (MetaSel (Just "_ocbreslisiCarrier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ocbreslisiTrackingId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ocbreslisiShipmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

ocbreslisiCarrier :: Lens' OrdersCustomBatchRequestEntryShipLineItemsShipmentInfo (Maybe Text) Source #

The carrier handling the shipment. See shipments[].carrier in the Orders resource representation for a list of acceptable values.

AccountsLinkRequest

data AccountsLinkRequest Source #

Instances
Eq AccountsLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountsLinkRequest -> c AccountsLinkRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountsLinkRequest #

toConstr :: AccountsLinkRequest -> Constr #

dataTypeOf :: AccountsLinkRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountsLinkRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountsLinkRequest) #

gmapT :: (forall b. Data b => b -> b) -> AccountsLinkRequest -> AccountsLinkRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountsLinkRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountsLinkRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountsLinkRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountsLinkRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountsLinkRequest -> m AccountsLinkRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsLinkRequest -> m AccountsLinkRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsLinkRequest -> m AccountsLinkRequest #

Show AccountsLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccountsLinkRequest :: Type -> Type #

ToJSON AccountsLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsLinkRequest = D1 (MetaData "AccountsLinkRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountsLinkRequest'" PrefixI True) (S1 (MetaSel (Just "_alrAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_alrLinkedAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_alrLinkType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

accountsLinkRequest :: AccountsLinkRequest Source #

Creates a value of AccountsLinkRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

alrAction :: Lens' AccountsLinkRequest (Maybe Text) Source #

Action to perform for this link. The "request" action is only available to select merchants.

alrLinkedAccountId :: Lens' AccountsLinkRequest (Maybe Text) Source #

The ID of the linked account.

alrLinkType :: Lens' AccountsLinkRequest (Maybe Text) Source #

Type of the link between the two accounts.

Promotion

data Promotion Source #

Instances
Eq Promotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data Promotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Promotion -> c Promotion #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Promotion #

toConstr :: Promotion -> Constr #

dataTypeOf :: Promotion -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Promotion) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Promotion) #

gmapT :: (forall b. Data b => b -> b) -> Promotion -> Promotion #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Promotion -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Promotion -> r #

gmapQ :: (forall d. Data d => d -> u) -> Promotion -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Promotion -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Promotion -> m Promotion #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Promotion -> m Promotion #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Promotion -> m Promotion #

Show Promotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic Promotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Promotion :: Type -> Type #

ToJSON Promotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Promotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Promotion Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Promotion = D1 (MetaData "Promotion" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Promotion'" PrefixI True) (S1 (MetaSel (Just "_pPromotionAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Amount)) :*: S1 (MetaSel (Just "_pPromotionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

promotion :: Promotion Source #

Creates a value of Promotion with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pPromotionAmount :: Lens' Promotion (Maybe Amount) Source #

required
Amount of the promotion. The values here are the promotion applied to the unit price pretax and to the total of the tax amounts.

pPromotionId :: Lens' Promotion (Maybe Text) Source #

required
ID of the promotion.

DatafeedTarget

data DatafeedTarget Source #

Instances
Eq DatafeedTarget Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedTarget Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedTarget -> c DatafeedTarget #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedTarget #

toConstr :: DatafeedTarget -> Constr #

dataTypeOf :: DatafeedTarget -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedTarget) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedTarget) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedTarget -> DatafeedTarget #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedTarget -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedTarget -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedTarget -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedTarget -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedTarget -> m DatafeedTarget #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedTarget -> m DatafeedTarget #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedTarget -> m DatafeedTarget #

Show DatafeedTarget Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedTarget Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedTarget :: Type -> Type #

ToJSON DatafeedTarget Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedTarget Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedTarget Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedTarget = D1 (MetaData "DatafeedTarget" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedTarget'" PrefixI True) ((S1 (MetaSel (Just "_dtIncludedDestinations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_dtExcludedDestinations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_dtCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dtLanguage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

datafeedTarget :: DatafeedTarget Source #

Creates a value of DatafeedTarget with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dtIncludedDestinations :: Lens' DatafeedTarget [Text] Source #

The list of destinations to include for this target (corresponds to checked check boxes in Merchant Center). Default destinations are always included unless provided in the excluded_destination field.

dtExcludedDestinations :: Lens' DatafeedTarget [Text] Source #

The list of destinations to exclude for this target (corresponds to unchecked check boxes in Merchant Center).

dtCountry :: Lens' DatafeedTarget (Maybe Text) Source #

The country where the items in the feed will be included in the search index, represented as a CLDR territory code.

dtLanguage :: Lens' DatafeedTarget (Maybe Text) Source #

The two-letter ISO 639-1 language of the items in the feed. Must be a valid language for targets[].country.

OrdersUpdateMerchantOrderIdResponse

data OrdersUpdateMerchantOrderIdResponse Source #

Instances
Eq OrdersUpdateMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersUpdateMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersUpdateMerchantOrderIdResponse -> c OrdersUpdateMerchantOrderIdResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersUpdateMerchantOrderIdResponse #

toConstr :: OrdersUpdateMerchantOrderIdResponse -> Constr #

dataTypeOf :: OrdersUpdateMerchantOrderIdResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersUpdateMerchantOrderIdResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersUpdateMerchantOrderIdResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersUpdateMerchantOrderIdResponse -> OrdersUpdateMerchantOrderIdResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersUpdateMerchantOrderIdResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersUpdateMerchantOrderIdResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersUpdateMerchantOrderIdResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersUpdateMerchantOrderIdResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersUpdateMerchantOrderIdResponse -> m OrdersUpdateMerchantOrderIdResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersUpdateMerchantOrderIdResponse -> m OrdersUpdateMerchantOrderIdResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersUpdateMerchantOrderIdResponse -> m OrdersUpdateMerchantOrderIdResponse #

Show OrdersUpdateMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersUpdateMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrdersUpdateMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersUpdateMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateMerchantOrderIdResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersUpdateMerchantOrderIdResponse = D1 (MetaData "OrdersUpdateMerchantOrderIdResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersUpdateMerchantOrderIdResponse'" PrefixI True) (S1 (MetaSel (Just "_oumoirKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oumoirExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersUpdateMerchantOrderIdResponse :: OrdersUpdateMerchantOrderIdResponse Source #

Creates a value of OrdersUpdateMerchantOrderIdResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oumoirKind :: Lens' OrdersUpdateMerchantOrderIdResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersUpdateMerchantOrderIdResponse".

OrderreportsListDisbursementsResponse

data OrderreportsListDisbursementsResponse Source #

Instances
Eq OrderreportsListDisbursementsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderreportsListDisbursementsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderreportsListDisbursementsResponse -> c OrderreportsListDisbursementsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderreportsListDisbursementsResponse #

toConstr :: OrderreportsListDisbursementsResponse -> Constr #

dataTypeOf :: OrderreportsListDisbursementsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderreportsListDisbursementsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderreportsListDisbursementsResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrderreportsListDisbursementsResponse -> OrderreportsListDisbursementsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderreportsListDisbursementsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderreportsListDisbursementsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderreportsListDisbursementsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderreportsListDisbursementsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderreportsListDisbursementsResponse -> m OrderreportsListDisbursementsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderreportsListDisbursementsResponse -> m OrderreportsListDisbursementsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderreportsListDisbursementsResponse -> m OrderreportsListDisbursementsResponse #

Show OrderreportsListDisbursementsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderreportsListDisbursementsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderreportsListDisbursementsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderreportsListDisbursementsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderreportsListDisbursementsResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderreportsListDisbursementsResponse = D1 (MetaData "OrderreportsListDisbursementsResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderreportsListDisbursementsResponse'" PrefixI True) (S1 (MetaSel (Just "_oldrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oldrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oldrDisbursements") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderReportDisbursement])))))

orderreportsListDisbursementsResponse :: OrderreportsListDisbursementsResponse Source #

Creates a value of OrderreportsListDisbursementsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oldrNextPageToken :: Lens' OrderreportsListDisbursementsResponse (Maybe Text) Source #

The token for the retrieval of the next page of disbursements.

oldrKind :: Lens' OrderreportsListDisbursementsResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderreportsListDisbursementsResponse".

DatafeedStatusExample

data DatafeedStatusExample Source #

An example occurrence for a particular error.

See: datafeedStatusExample smart constructor.

Instances
Eq DatafeedStatusExample Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedStatusExample Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedStatusExample -> c DatafeedStatusExample #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedStatusExample #

toConstr :: DatafeedStatusExample -> Constr #

dataTypeOf :: DatafeedStatusExample -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedStatusExample) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedStatusExample) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedStatusExample -> DatafeedStatusExample #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedStatusExample -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedStatusExample -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedStatusExample -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedStatusExample -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedStatusExample -> m DatafeedStatusExample #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedStatusExample -> m DatafeedStatusExample #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedStatusExample -> m DatafeedStatusExample #

Show DatafeedStatusExample Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedStatusExample Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedStatusExample :: Type -> Type #

ToJSON DatafeedStatusExample Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedStatusExample Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedStatusExample Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedStatusExample = D1 (MetaData "DatafeedStatusExample" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedStatusExample'" PrefixI True) (S1 (MetaSel (Just "_dseLineNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_dseItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dseValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

datafeedStatusExample :: DatafeedStatusExample Source #

Creates a value of DatafeedStatusExample with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dseLineNumber :: Lens' DatafeedStatusExample (Maybe Word64) Source #

Line number in the data feed where the example is found.

dseItemId :: Lens' DatafeedStatusExample (Maybe Text) Source #

The ID of the example item.

OrdersAcknowledgeResponse

data OrdersAcknowledgeResponse Source #

Instances
Eq OrdersAcknowledgeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersAcknowledgeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersAcknowledgeResponse -> c OrdersAcknowledgeResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersAcknowledgeResponse #

toConstr :: OrdersAcknowledgeResponse -> Constr #

dataTypeOf :: OrdersAcknowledgeResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersAcknowledgeResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersAcknowledgeResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrdersAcknowledgeResponse -> OrdersAcknowledgeResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersAcknowledgeResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersAcknowledgeResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersAcknowledgeResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersAcknowledgeResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersAcknowledgeResponse -> m OrdersAcknowledgeResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersAcknowledgeResponse -> m OrdersAcknowledgeResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersAcknowledgeResponse -> m OrdersAcknowledgeResponse #

Show OrdersAcknowledgeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersAcknowledgeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersAcknowledgeResponse :: Type -> Type #

ToJSON OrdersAcknowledgeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersAcknowledgeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersAcknowledgeResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersAcknowledgeResponse = D1 (MetaData "OrdersAcknowledgeResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersAcknowledgeResponse'" PrefixI True) (S1 (MetaSel (Just "_oarKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_oarExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

ordersAcknowledgeResponse :: OrdersAcknowledgeResponse Source #

Creates a value of OrdersAcknowledgeResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

oarKind :: Lens' OrdersAcknowledgeResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#ordersAcknowledgeResponse".

PosSaleRequest

data PosSaleRequest Source #

Instances
Eq PosSaleRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosSaleRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosSaleRequest -> c PosSaleRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosSaleRequest #

toConstr :: PosSaleRequest -> Constr #

dataTypeOf :: PosSaleRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosSaleRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosSaleRequest) #

gmapT :: (forall b. Data b => b -> b) -> PosSaleRequest -> PosSaleRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosSaleRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosSaleRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosSaleRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosSaleRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosSaleRequest -> m PosSaleRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosSaleRequest -> m PosSaleRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosSaleRequest -> m PosSaleRequest #

Show PosSaleRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosSaleRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosSaleRequest :: Type -> Type #

ToJSON PosSaleRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosSaleRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosSaleRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosSaleRequest = D1 (MetaData "PosSaleRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosSaleRequest'" PrefixI True) (((S1 (MetaSel (Just "_psrsStoreCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psrsItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_psrsQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_psrsTargetCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_psrsGtin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psrsPrice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))) :*: (S1 (MetaSel (Just "_psrsContentLanguage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_psrsTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psrsSaleId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

posSaleRequest :: PosSaleRequest Source #

Creates a value of PosSaleRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

psrsStoreCode :: Lens' PosSaleRequest (Maybe Text) Source #

The identifier of the merchant's store. Either a storeCode inserted via the API or the code of the store in Google My Business.

psrsItemId :: Lens' PosSaleRequest (Maybe Text) Source #

A unique identifier for the item.

psrsQuantity :: Lens' PosSaleRequest (Maybe Int64) Source #

The relative change of the available quantity. Negative for items returned.

psrsTargetCountry :: Lens' PosSaleRequest (Maybe Text) Source #

The CLDR territory code for the item.

psrsGtin :: Lens' PosSaleRequest (Maybe Text) Source #

Global Trade Item Number.

psrsPrice :: Lens' PosSaleRequest (Maybe Price) Source #

The price of the item.

psrsContentLanguage :: Lens' PosSaleRequest (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

psrsTimestamp :: Lens' PosSaleRequest (Maybe Text) Source #

The inventory timestamp, in ISO 8601 format.

psrsSaleId :: Lens' PosSaleRequest (Maybe Text) Source #

A unique ID to group items from the same sale event.

Table

data Table Source #

Instances
Eq Table Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Table -> Table -> Bool #

(/=) :: Table -> Table -> Bool #

Data Table Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Table -> c Table #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Table #

toConstr :: Table -> Constr #

dataTypeOf :: Table -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Table) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Table) #

gmapT :: (forall b. Data b => b -> b) -> Table -> Table #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Table -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Table -> r #

gmapQ :: (forall d. Data d => d -> u) -> Table -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Table -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Table -> m Table #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Table -> m Table #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Table -> m Table #

Show Table Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

showsPrec :: Int -> Table -> ShowS #

show :: Table -> String #

showList :: [Table] -> ShowS #

Generic Table Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Table :: Type -> Type #

Methods

from :: Table -> Rep Table x #

to :: Rep Table x -> Table #

ToJSON Table Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Table Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Table Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Table = D1 (MetaData "Table" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Table'" PrefixI True) ((S1 (MetaSel (Just "_tRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Row])) :*: S1 (MetaSel (Just "_tName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_tColumnHeaders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Headers)) :*: S1 (MetaSel (Just "_tRowHeaders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Headers)))))

table :: Table Source #

Creates a value of Table with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

tRows :: Lens' Table [Row] Source #

The list of rows that constitute the table. Must have the same length as rowHeaders. Required.

tName :: Lens' Table (Maybe Text) Source #

Name of the table. Required for subtables, ignored for the main table.

tColumnHeaders :: Lens' Table (Maybe Headers) Source #

Headers of the table's columns. Optional: if not set then the table has only one dimension.

tRowHeaders :: Lens' Table (Maybe Headers) Source #

Headers of the table's rows. Required.

Order

data Order Source #

Order. All methods require the order manager role.

See: order smart constructor.

Instances
Eq Order Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

(==) :: Order -> Order -> Bool #

(/=) :: Order -> Order -> Bool #

Data Order Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Order -> c Order #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Order #

toConstr :: Order -> Constr #

dataTypeOf :: Order -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Order) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Order) #

gmapT :: (forall b. Data b => b -> b) -> Order -> Order #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Order -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Order -> r #

gmapQ :: (forall d. Data d => d -> u) -> Order -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Order -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Order -> m Order #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Order -> m Order #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Order -> m Order #

Show Order Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

showsPrec :: Int -> Order -> ShowS #

show :: Order -> String #

showList :: [Order] -> ShowS #

Generic Order Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep Order :: Type -> Type #

Methods

from :: Order -> Rep Order x #

to :: Rep Order x -> Order #

ToJSON Order Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON Order Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Order Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep Order = D1 (MetaData "Order" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "Order'" PrefixI True) ((((S1 (MetaSel (Just "_o1Status") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_o1MerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))) :*: (S1 (MetaSel (Just "_o1Refunds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderRefund])) :*: (S1 (MetaSel (Just "_o1Kind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_o1LineItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderLineItem]))))) :*: ((S1 (MetaSel (Just "_o1Shipments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderShipment])) :*: S1 (MetaSel (Just "_o1NetAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))) :*: (S1 (MetaSel (Just "_o1PlacedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_o1DeliveryDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderDeliveryDetails)) :*: S1 (MetaSel (Just "_o1ShippingOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) :*: (((S1 (MetaSel (Just "_o1MerchantOrderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_o1Acknowledged") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_o1ShippingCostTax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: (S1 (MetaSel (Just "_o1Customer") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderCustomer)) :*: S1 (MetaSel (Just "_o1BillingAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderAddress))))) :*: ((S1 (MetaSel (Just "_o1Id") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_o1Promotions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderPromotion]))) :*: (S1 (MetaSel (Just "_o1ChannelType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_o1PaymentStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_o1ShippingCost") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))))))))

o1Status :: Lens' Order (Maybe Text) Source #

The status of the order.

o1Refunds :: Lens' Order [OrderRefund] Source #

Refunds for the order.

o1Kind :: Lens' Order Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#order".

o1LineItems :: Lens' Order [OrderLineItem] Source #

Line items that are ordered.

o1Shipments :: Lens' Order [OrderShipment] Source #

Shipments of the order.

o1NetAmount :: Lens' Order (Maybe Price) Source #

The net amount for the order. For example, if an order was originally for a grand total of $100 and a refund was issued for $20, the net amount will be $80.

o1PlacedDate :: Lens' Order (Maybe Text) Source #

The date when the order was placed, in ISO 8601 format.

o1DeliveryDetails :: Lens' Order (Maybe OrderDeliveryDetails) Source #

The details for the delivery.

o1ShippingOption :: Lens' Order (Maybe Text) Source #

The requested shipping option.

o1MerchantOrderId :: Lens' Order (Maybe Text) Source #

Merchant-provided id of the order.

o1Acknowledged :: Lens' Order (Maybe Bool) Source #

Whether the order was acknowledged.

o1ShippingCostTax :: Lens' Order (Maybe Price) Source #

The tax for the total shipping cost.

o1Customer :: Lens' Order (Maybe OrderCustomer) Source #

The details of the customer who placed the order.

o1Id :: Lens' Order (Maybe Text) Source #

The REST id of the order. Globally unique.

o1Promotions :: Lens' Order [OrderPromotion] Source #

Promotions associated with the order.

o1ChannelType :: Lens' Order (Maybe Text) Source #

The channel type of the order: "purchaseOnGoogle" or "googleExpress".

o1PaymentStatus :: Lens' Order (Maybe Text) Source #

The status of the payment.

o1ShippingCost :: Lens' Order (Maybe Price) Source #

The total cost of shipping for all items.

OrderLineItemProduct

data OrderLineItemProduct Source #

Instances
Eq OrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderLineItemProduct -> c OrderLineItemProduct #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderLineItemProduct #

toConstr :: OrderLineItemProduct -> Constr #

dataTypeOf :: OrderLineItemProduct -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderLineItemProduct) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderLineItemProduct) #

gmapT :: (forall b. Data b => b -> b) -> OrderLineItemProduct -> OrderLineItemProduct #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemProduct -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderLineItemProduct -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderLineItemProduct -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderLineItemProduct -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderLineItemProduct -> m OrderLineItemProduct #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemProduct -> m OrderLineItemProduct #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderLineItemProduct -> m OrderLineItemProduct #

Show OrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderLineItemProduct :: Type -> Type #

ToJSON OrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemProduct Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderLineItemProduct = D1 (MetaData "OrderLineItemProduct" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderLineItemProduct'" PrefixI True) ((((S1 (MetaSel (Just "_olipImageLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olipShownImage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_olipFees") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderLineItemProductFee])) :*: S1 (MetaSel (Just "_olipChannel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_olipBrand") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olipTargetCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_olipGtin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olipItemGroupId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: (((S1 (MetaSel (Just "_olipOfferId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olipId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_olipPrice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_olipVariantAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OrderLineItemProductVariantAttribute])))) :*: ((S1 (MetaSel (Just "_olipTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olipContentLanguage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_olipMpn") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olipCondition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

olipImageLink :: Lens' OrderLineItemProduct (Maybe Text) Source #

URL of an image of the item.

olipShownImage :: Lens' OrderLineItemProduct (Maybe Text) Source #

URL to the cached image shown to the user when order was placed.

olipFees :: Lens' OrderLineItemProduct [OrderLineItemProductFee] Source #

Associated fees at order creation time.

olipChannel :: Lens' OrderLineItemProduct (Maybe Text) Source #

The item's channel (online or local).

olipTargetCountry :: Lens' OrderLineItemProduct (Maybe Text) Source #

The CLDR territory code of the target country of the product.

olipGtin :: Lens' OrderLineItemProduct (Maybe Text) Source #

Global Trade Item Number (GTIN) of the item.

olipItemGroupId :: Lens' OrderLineItemProduct (Maybe Text) Source #

Shared identifier for all variants of the same product.

olipOfferId :: Lens' OrderLineItemProduct (Maybe Text) Source #

An identifier of the item.

olipId :: Lens' OrderLineItemProduct (Maybe Text) Source #

The REST id of the product.

olipVariantAttributes :: Lens' OrderLineItemProduct [OrderLineItemProductVariantAttribute] Source #

Variant attributes for the item. These are dimensions of the product, such as color, gender, material, pattern, and size. You can find a comprehensive list of variant attributes here.

olipTitle :: Lens' OrderLineItemProduct (Maybe Text) Source #

The title of the product.

olipContentLanguage :: Lens' OrderLineItemProduct (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

olipMpn :: Lens' OrderLineItemProduct (Maybe Text) Source #

Manufacturer Part Number (MPN) of the item.

olipCondition :: Lens' OrderLineItemProduct (Maybe Text) Source #

Condition or state of the item.

AccounttaxCustomBatchRequestEntry

data AccounttaxCustomBatchRequestEntry Source #

A batch entry encoding a single non-batch accounttax request.

See: accounttaxCustomBatchRequestEntry smart constructor.

Instances
Eq AccounttaxCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccounttaxCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccounttaxCustomBatchRequestEntry -> c AccounttaxCustomBatchRequestEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccounttaxCustomBatchRequestEntry #

toConstr :: AccounttaxCustomBatchRequestEntry -> Constr #

dataTypeOf :: AccounttaxCustomBatchRequestEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccounttaxCustomBatchRequestEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccounttaxCustomBatchRequestEntry) #

gmapT :: (forall b. Data b => b -> b) -> AccounttaxCustomBatchRequestEntry -> AccounttaxCustomBatchRequestEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccounttaxCustomBatchRequestEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccounttaxCustomBatchRequestEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccounttaxCustomBatchRequestEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccounttaxCustomBatchRequestEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchRequestEntry -> m AccounttaxCustomBatchRequestEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchRequestEntry -> m AccounttaxCustomBatchRequestEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccounttaxCustomBatchRequestEntry -> m AccounttaxCustomBatchRequestEntry #

Show AccounttaxCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccounttaxCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep AccounttaxCustomBatchRequestEntry :: Type -> Type #

ToJSON AccounttaxCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccounttaxCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxCustomBatchRequestEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccounttaxCustomBatchRequestEntry = D1 (MetaData "AccounttaxCustomBatchRequestEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccounttaxCustomBatchRequestEntry'" PrefixI True) ((S1 (MetaSel (Just "_acccAccountTax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AccountTax)) :*: S1 (MetaSel (Just "_acccMerchantId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))) :*: (S1 (MetaSel (Just "_acccAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_acccMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acccBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))))

accounttaxCustomBatchRequestEntry :: AccounttaxCustomBatchRequestEntry Source #

Creates a value of AccounttaxCustomBatchRequestEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acccAccountTax :: Lens' AccounttaxCustomBatchRequestEntry (Maybe AccountTax) Source #

The account tax settings to update. Only defined if the method is update.

acccAccountId :: Lens' AccounttaxCustomBatchRequestEntry (Maybe Word64) Source #

The ID of the account for which to get/update account tax settings.

acccBatchId :: Lens' AccounttaxCustomBatchRequestEntry (Maybe Word32) Source #

An entry ID, unique within the batch request.

DatafeedStatusError

data DatafeedStatusError Source #

An error occurring in the feed, like "invalid price".

See: datafeedStatusError smart constructor.

Instances
Eq DatafeedStatusError Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedStatusError Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedStatusError -> c DatafeedStatusError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedStatusError #

toConstr :: DatafeedStatusError -> Constr #

dataTypeOf :: DatafeedStatusError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedStatusError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedStatusError) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedStatusError -> DatafeedStatusError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedStatusError -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedStatusError -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedStatusError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedStatusError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedStatusError -> m DatafeedStatusError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedStatusError -> m DatafeedStatusError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedStatusError -> m DatafeedStatusError #

Show DatafeedStatusError Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedStatusError Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedStatusError :: Type -> Type #

ToJSON DatafeedStatusError Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedStatusError Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedStatusError Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedStatusError = D1 (MetaData "DatafeedStatusError" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedStatusError'" PrefixI True) ((S1 (MetaSel (Just "_dseCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_dseCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_dseMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dseExamples") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DatafeedStatusExample])))))

datafeedStatusError :: DatafeedStatusError Source #

Creates a value of DatafeedStatusError with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dseCount :: Lens' DatafeedStatusError (Maybe Word64) Source #

The number of occurrences of the error in the feed.

dseCode :: Lens' DatafeedStatusError (Maybe Text) Source #

The code of the error, e.g., "validation/invalid_value".

dseMessage :: Lens' DatafeedStatusError (Maybe Text) Source #

The error message, e.g., "Invalid price".

dseExamples :: Lens' DatafeedStatusError [DatafeedStatusExample] Source #

A list of example occurrences of the error, grouped by product.

ProductsCustomBatchRequest

data ProductsCustomBatchRequest Source #

Instances
Eq ProductsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductsCustomBatchRequest -> c ProductsCustomBatchRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductsCustomBatchRequest #

toConstr :: ProductsCustomBatchRequest -> Constr #

dataTypeOf :: ProductsCustomBatchRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductsCustomBatchRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductsCustomBatchRequest) #

gmapT :: (forall b. Data b => b -> b) -> ProductsCustomBatchRequest -> ProductsCustomBatchRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductsCustomBatchRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductsCustomBatchRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductsCustomBatchRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductsCustomBatchRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductsCustomBatchRequest -> m ProductsCustomBatchRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductsCustomBatchRequest -> m ProductsCustomBatchRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductsCustomBatchRequest -> m ProductsCustomBatchRequest #

Show ProductsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductsCustomBatchRequest :: Type -> Type #

ToJSON ProductsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsCustomBatchRequest = D1 (MetaData "ProductsCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "ProductsCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_ppEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [ProductsCustomBatchRequestEntry]))))

productsCustomBatchRequest :: ProductsCustomBatchRequest Source #

Creates a value of ProductsCustomBatchRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ppEntries :: Lens' ProductsCustomBatchRequest [ProductsCustomBatchRequestEntry] Source #

The request entries to be processed in the batch.

PosDataProviders

data PosDataProviders Source #

Instances
Eq PosDataProviders Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosDataProviders Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosDataProviders -> c PosDataProviders #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosDataProviders #

toConstr :: PosDataProviders -> Constr #

dataTypeOf :: PosDataProviders -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosDataProviders) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosDataProviders) #

gmapT :: (forall b. Data b => b -> b) -> PosDataProviders -> PosDataProviders #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosDataProviders -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosDataProviders -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosDataProviders -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosDataProviders -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosDataProviders -> m PosDataProviders #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosDataProviders -> m PosDataProviders #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosDataProviders -> m PosDataProviders #

Show PosDataProviders Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosDataProviders Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosDataProviders :: Type -> Type #

ToJSON PosDataProviders Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosDataProviders Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosDataProviders Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosDataProviders = D1 (MetaData "PosDataProviders" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "PosDataProviders'" PrefixI True) (S1 (MetaSel (Just "_pdpCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pdpPosDataProviders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PosDataProvidersPosDataProvider]))))

posDataProviders :: PosDataProviders Source #

Creates a value of PosDataProviders with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

PosInventory

data PosInventory Source #

The absolute quantity of an item available at the given store.

See: posInventory smart constructor.

Instances
Eq PosInventory Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data PosInventory Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosInventory -> c PosInventory #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PosInventory #

toConstr :: PosInventory -> Constr #

dataTypeOf :: PosInventory -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PosInventory) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PosInventory) #

gmapT :: (forall b. Data b => b -> b) -> PosInventory -> PosInventory #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosInventory -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosInventory -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosInventory -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosInventory -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosInventory -> m PosInventory #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosInventory -> m PosInventory #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosInventory -> m PosInventory #

Show PosInventory Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic PosInventory Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep PosInventory :: Type -> Type #

ToJSON PosInventory Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON PosInventory Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep PosInventory Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

posInventory :: PosInventory Source #

Creates a value of PosInventory with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

piStoreCode :: Lens' PosInventory (Maybe Text) Source #

The identifier of the merchant's store. Either a storeCode inserted via the API or the code of the store in Google My Business.

piKind :: Lens' PosInventory Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#posInventory".

piItemId :: Lens' PosInventory (Maybe Text) Source #

A unique identifier for the item.

piQuantity :: Lens' PosInventory (Maybe Int64) Source #

The available quantity of the item.

piTargetCountry :: Lens' PosInventory (Maybe Text) Source #

The CLDR territory code for the item.

piGtin :: Lens' PosInventory (Maybe Text) Source #

Global Trade Item Number.

piPrice :: Lens' PosInventory (Maybe Price) Source #

The current price of the item.

piContentLanguage :: Lens' PosInventory (Maybe Text) Source #

The two-letter ISO 639-1 language code for the item.

piTimestamp :: Lens' PosInventory (Maybe Text) Source #

The inventory timestamp, in ISO 8601 format.

LiaSettingsListPosDataProvidersResponse

data LiaSettingsListPosDataProvidersResponse Source #

Instances
Eq LiaSettingsListPosDataProvidersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data LiaSettingsListPosDataProvidersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LiaSettingsListPosDataProvidersResponse -> c LiaSettingsListPosDataProvidersResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LiaSettingsListPosDataProvidersResponse #

toConstr :: LiaSettingsListPosDataProvidersResponse -> Constr #

dataTypeOf :: LiaSettingsListPosDataProvidersResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LiaSettingsListPosDataProvidersResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LiaSettingsListPosDataProvidersResponse) #

gmapT :: (forall b. Data b => b -> b) -> LiaSettingsListPosDataProvidersResponse -> LiaSettingsListPosDataProvidersResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsListPosDataProvidersResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LiaSettingsListPosDataProvidersResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> LiaSettingsListPosDataProvidersResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LiaSettingsListPosDataProvidersResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LiaSettingsListPosDataProvidersResponse -> m LiaSettingsListPosDataProvidersResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsListPosDataProvidersResponse -> m LiaSettingsListPosDataProvidersResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LiaSettingsListPosDataProvidersResponse -> m LiaSettingsListPosDataProvidersResponse #

Show LiaSettingsListPosDataProvidersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic LiaSettingsListPosDataProvidersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON LiaSettingsListPosDataProvidersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON LiaSettingsListPosDataProvidersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsListPosDataProvidersResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep LiaSettingsListPosDataProvidersResponse = D1 (MetaData "LiaSettingsListPosDataProvidersResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "LiaSettingsListPosDataProvidersResponse'" PrefixI True) (S1 (MetaSel (Just "_lslpdprKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_lslpdprPosDataProviders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [PosDataProviders]))))

liaSettingsListPosDataProvidersResponse :: LiaSettingsListPosDataProvidersResponse Source #

Creates a value of LiaSettingsListPosDataProvidersResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lslpdprKind :: Lens' LiaSettingsListPosDataProvidersResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#liasettingsListPosDataProvidersResponse".

lslpdprPosDataProviders :: Lens' LiaSettingsListPosDataProvidersResponse [PosDataProviders] Source #

The list of POS data providers for each eligible country

OrderinvoicesCreateRefundInvoiceRequest

data OrderinvoicesCreateRefundInvoiceRequest Source #

Instances
Eq OrderinvoicesCreateRefundInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderinvoicesCreateRefundInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderinvoicesCreateRefundInvoiceRequest -> c OrderinvoicesCreateRefundInvoiceRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderinvoicesCreateRefundInvoiceRequest #

toConstr :: OrderinvoicesCreateRefundInvoiceRequest -> Constr #

dataTypeOf :: OrderinvoicesCreateRefundInvoiceRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderinvoicesCreateRefundInvoiceRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderinvoicesCreateRefundInvoiceRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrderinvoicesCreateRefundInvoiceRequest -> OrderinvoicesCreateRefundInvoiceRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderinvoicesCreateRefundInvoiceRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderinvoicesCreateRefundInvoiceRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderinvoicesCreateRefundInvoiceRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderinvoicesCreateRefundInvoiceRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderinvoicesCreateRefundInvoiceRequest -> m OrderinvoicesCreateRefundInvoiceRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderinvoicesCreateRefundInvoiceRequest -> m OrderinvoicesCreateRefundInvoiceRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderinvoicesCreateRefundInvoiceRequest -> m OrderinvoicesCreateRefundInvoiceRequest #

Show OrderinvoicesCreateRefundInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderinvoicesCreateRefundInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON OrderinvoicesCreateRefundInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderinvoicesCreateRefundInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCreateRefundInvoiceRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderinvoicesCreateRefundInvoiceRequest = D1 (MetaData "OrderinvoicesCreateRefundInvoiceRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderinvoicesCreateRefundInvoiceRequest'" PrefixI True) ((S1 (MetaSel (Just "_ocrirRefundOnlyOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption)) :*: S1 (MetaSel (Just "_ocrirInvoiceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ocrirShipmentInvoices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ShipmentInvoice])) :*: (S1 (MetaSel (Just "_ocrirOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ocrirReturnOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption))))))

orderinvoicesCreateRefundInvoiceRequest :: OrderinvoicesCreateRefundInvoiceRequest Source #

Creates a value of OrderinvoicesCreateRefundInvoiceRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ocrirRefundOnlyOption :: Lens' OrderinvoicesCreateRefundInvoiceRequest (Maybe OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceRefundOption) Source #

Option to create a refund-only invoice. Exactly one of refundOnlyOption or returnOption must be provided.

ocrirOperationId :: Lens' OrderinvoicesCreateRefundInvoiceRequest (Maybe Text) Source #

required
The ID of the operation, unique across all operations for a given order.

ocrirReturnOption :: Lens' OrderinvoicesCreateRefundInvoiceRequest (Maybe OrderinvoicesCustomBatchRequestEntryCreateRefundInvoiceReturnOption) Source #

Option to create an invoice for a refund and mark all items within the invoice as returned. Exactly one of refundOnlyOption or returnOption must be provided.

DatafeedStatus

data DatafeedStatus Source #

The status of a datafeed, i.e., the result of the last retrieval of the datafeed computed asynchronously when the feed processing is finished.

See: datafeedStatus smart constructor.

Instances
Eq DatafeedStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedStatus -> c DatafeedStatus #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedStatus #

toConstr :: DatafeedStatus -> Constr #

dataTypeOf :: DatafeedStatus -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedStatus) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedStatus) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedStatus -> DatafeedStatus #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedStatus -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedStatus -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedStatus -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedStatus -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedStatus -> m DatafeedStatus #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedStatus -> m DatafeedStatus #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedStatus -> m DatafeedStatus #

Show DatafeedStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedStatus :: Type -> Type #

ToJSON DatafeedStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedStatus Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

datafeedStatus :: DatafeedStatus Source #

Creates a value of DatafeedStatus with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dsItemsTotal :: Lens' DatafeedStatus (Maybe Word64) Source #

The number of items in the feed that were processed.

dsCountry :: Lens' DatafeedStatus (Maybe Text) Source #

The country for which the status is reported, represented as a CLDR territory code.

dsKind :: Lens' DatafeedStatus Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#datafeedStatus".

dsWarnings :: Lens' DatafeedStatus [DatafeedStatusError] Source #

The list of errors occurring in the feed.

dsDatafeedId :: Lens' DatafeedStatus (Maybe Word64) Source #

The ID of the feed for which the status is reported.

dsProcessingStatus :: Lens' DatafeedStatus (Maybe Text) Source #

The processing status of the feed.

dsLanguage :: Lens' DatafeedStatus (Maybe Text) Source #

The two-letter ISO 639-1 language for which the status is reported.

dsLastUploadDate :: Lens' DatafeedStatus (Maybe Text) Source #

The last date at which the feed was uploaded.

dsItemsValid :: Lens' DatafeedStatus (Maybe Word64) Source #

The number of items in the feed that were valid.

dsErrors :: Lens' DatafeedStatus [DatafeedStatusError] Source #

The list of errors occurring in the feed.

DatafeedstatusesCustomBatchRequest

data DatafeedstatusesCustomBatchRequest Source #

Instances
Eq DatafeedstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedstatusesCustomBatchRequest -> c DatafeedstatusesCustomBatchRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedstatusesCustomBatchRequest #

toConstr :: DatafeedstatusesCustomBatchRequest -> Constr #

dataTypeOf :: DatafeedstatusesCustomBatchRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedstatusesCustomBatchRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedstatusesCustomBatchRequest) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedstatusesCustomBatchRequest -> DatafeedstatusesCustomBatchRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedstatusesCustomBatchRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedstatusesCustomBatchRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedstatusesCustomBatchRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedstatusesCustomBatchRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchRequest -> m DatafeedstatusesCustomBatchRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchRequest -> m DatafeedstatusesCustomBatchRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedstatusesCustomBatchRequest -> m DatafeedstatusesCustomBatchRequest #

Show DatafeedstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedstatusesCustomBatchRequest :: Type -> Type #

ToJSON DatafeedstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesCustomBatchRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesCustomBatchRequest = D1 (MetaData "DatafeedstatusesCustomBatchRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" True) (C1 (MetaCons "DatafeedstatusesCustomBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_dcbrcEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DatafeedstatusesCustomBatchRequestEntry]))))

datafeedstatusesCustomBatchRequest :: DatafeedstatusesCustomBatchRequest Source #

Creates a value of DatafeedstatusesCustomBatchRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

OrderpaymentsNotifyRefundResponse

data OrderpaymentsNotifyRefundResponse Source #

Instances
Eq OrderpaymentsNotifyRefundResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderpaymentsNotifyRefundResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderpaymentsNotifyRefundResponse -> c OrderpaymentsNotifyRefundResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderpaymentsNotifyRefundResponse #

toConstr :: OrderpaymentsNotifyRefundResponse -> Constr #

dataTypeOf :: OrderpaymentsNotifyRefundResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderpaymentsNotifyRefundResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderpaymentsNotifyRefundResponse) #

gmapT :: (forall b. Data b => b -> b) -> OrderpaymentsNotifyRefundResponse -> OrderpaymentsNotifyRefundResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyRefundResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderpaymentsNotifyRefundResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderpaymentsNotifyRefundResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderpaymentsNotifyRefundResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyRefundResponse -> m OrderpaymentsNotifyRefundResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyRefundResponse -> m OrderpaymentsNotifyRefundResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderpaymentsNotifyRefundResponse -> m OrderpaymentsNotifyRefundResponse #

Show OrderpaymentsNotifyRefundResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderpaymentsNotifyRefundResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderpaymentsNotifyRefundResponse :: Type -> Type #

ToJSON OrderpaymentsNotifyRefundResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderpaymentsNotifyRefundResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyRefundResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderpaymentsNotifyRefundResponse = D1 (MetaData "OrderpaymentsNotifyRefundResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderpaymentsNotifyRefundResponse'" PrefixI True) (S1 (MetaSel (Just "_onrrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_onrrExecutionStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

orderpaymentsNotifyRefundResponse :: OrderpaymentsNotifyRefundResponse Source #

Creates a value of OrderpaymentsNotifyRefundResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

onrrKind :: Lens' OrderpaymentsNotifyRefundResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#orderpaymentsNotifyRefundResponse".

OrdersInStoreRefundLineItemRequest

data OrdersInStoreRefundLineItemRequest Source #

Instances
Eq OrdersInStoreRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrdersInStoreRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrdersInStoreRefundLineItemRequest -> c OrdersInStoreRefundLineItemRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrdersInStoreRefundLineItemRequest #

toConstr :: OrdersInStoreRefundLineItemRequest -> Constr #

dataTypeOf :: OrdersInStoreRefundLineItemRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrdersInStoreRefundLineItemRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrdersInStoreRefundLineItemRequest) #

gmapT :: (forall b. Data b => b -> b) -> OrdersInStoreRefundLineItemRequest -> OrdersInStoreRefundLineItemRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrdersInStoreRefundLineItemRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrdersInStoreRefundLineItemRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrdersInStoreRefundLineItemRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrdersInStoreRefundLineItemRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrdersInStoreRefundLineItemRequest -> m OrdersInStoreRefundLineItemRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersInStoreRefundLineItemRequest -> m OrdersInStoreRefundLineItemRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrdersInStoreRefundLineItemRequest -> m OrdersInStoreRefundLineItemRequest #

Show OrdersInStoreRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrdersInStoreRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrdersInStoreRefundLineItemRequest :: Type -> Type #

ToJSON OrdersInStoreRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrdersInStoreRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersInStoreRefundLineItemRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrdersInStoreRefundLineItemRequest = D1 (MetaData "OrdersInStoreRefundLineItemRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrdersInStoreRefundLineItemRequest'" PrefixI True) (((S1 (MetaSel (Just "_oisrlirQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_oisrlirLineItemId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_oisrlirReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oisrlirOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_oisrlirProductId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oisrlirTaxAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price))) :*: (S1 (MetaSel (Just "_oisrlirPriceAmount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Price)) :*: S1 (MetaSel (Just "_oisrlirReasonText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

oisrlirLineItemId :: Lens' OrdersInStoreRefundLineItemRequest (Maybe Text) Source #

The ID of the line item to return. Either lineItemId or productId is required.

oisrlirOperationId :: Lens' OrdersInStoreRefundLineItemRequest (Maybe Text) Source #

The ID of the operation. Unique across all operations for a given order.

oisrlirProductId :: Lens' OrdersInStoreRefundLineItemRequest (Maybe Text) Source #

The ID of the product to return. This is the REST ID used in the products service. Either lineItemId or productId is required.

oisrlirTaxAmount :: Lens' OrdersInStoreRefundLineItemRequest (Maybe Price) Source #

The amount of tax to be refunded. Required.

oisrlirPriceAmount :: Lens' OrdersInStoreRefundLineItemRequest (Maybe Price) Source #

The amount to be refunded. This may be pre-tax or post-tax depending on the location of the order. Required.

AccountsCustomBatchRequestEntryLinkRequest

data AccountsCustomBatchRequestEntryLinkRequest Source #

Instances
Eq AccountsCustomBatchRequestEntryLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data AccountsCustomBatchRequestEntryLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AccountsCustomBatchRequestEntryLinkRequest -> c AccountsCustomBatchRequestEntryLinkRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AccountsCustomBatchRequestEntryLinkRequest #

toConstr :: AccountsCustomBatchRequestEntryLinkRequest -> Constr #

dataTypeOf :: AccountsCustomBatchRequestEntryLinkRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AccountsCustomBatchRequestEntryLinkRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AccountsCustomBatchRequestEntryLinkRequest) #

gmapT :: (forall b. Data b => b -> b) -> AccountsCustomBatchRequestEntryLinkRequest -> AccountsCustomBatchRequestEntryLinkRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AccountsCustomBatchRequestEntryLinkRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AccountsCustomBatchRequestEntryLinkRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AccountsCustomBatchRequestEntryLinkRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AccountsCustomBatchRequestEntryLinkRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequestEntryLinkRequest -> m AccountsCustomBatchRequestEntryLinkRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequestEntryLinkRequest -> m AccountsCustomBatchRequestEntryLinkRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AccountsCustomBatchRequestEntryLinkRequest -> m AccountsCustomBatchRequestEntryLinkRequest #

Show AccountsCustomBatchRequestEntryLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic AccountsCustomBatchRequestEntryLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

ToJSON AccountsCustomBatchRequestEntryLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON AccountsCustomBatchRequestEntryLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchRequestEntryLinkRequest Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep AccountsCustomBatchRequestEntryLinkRequest = D1 (MetaData "AccountsCustomBatchRequestEntryLinkRequest" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "AccountsCustomBatchRequestEntryLinkRequest'" PrefixI True) (S1 (MetaSel (Just "_acbrelrAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_acbrelrLinkedAccountId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acbrelrLinkType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

accountsCustomBatchRequestEntryLinkRequest :: AccountsCustomBatchRequestEntryLinkRequest Source #

Creates a value of AccountsCustomBatchRequestEntryLinkRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acbrelrAction :: Lens' AccountsCustomBatchRequestEntryLinkRequest (Maybe Text) Source #

Action to perform for this link. The "request" action is only available to select merchants.

acbrelrLinkType :: Lens' AccountsCustomBatchRequestEntryLinkRequest (Maybe Text) Source #

Type of the link between the two accounts.

ProductShippingDimension

data ProductShippingDimension Source #

Instances
Eq ProductShippingDimension Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductShippingDimension Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductShippingDimension -> c ProductShippingDimension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductShippingDimension #

toConstr :: ProductShippingDimension -> Constr #

dataTypeOf :: ProductShippingDimension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductShippingDimension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductShippingDimension) #

gmapT :: (forall b. Data b => b -> b) -> ProductShippingDimension -> ProductShippingDimension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductShippingDimension -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductShippingDimension -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductShippingDimension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductShippingDimension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductShippingDimension -> m ProductShippingDimension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductShippingDimension -> m ProductShippingDimension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductShippingDimension -> m ProductShippingDimension #

Show ProductShippingDimension Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductShippingDimension Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductShippingDimension :: Type -> Type #

ToJSON ProductShippingDimension Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductShippingDimension Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductShippingDimension Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductShippingDimension = D1 (MetaData "ProductShippingDimension" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductShippingDimension'" PrefixI True) (S1 (MetaSel (Just "_psdValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_psdUnit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

productShippingDimension :: ProductShippingDimension Source #

Creates a value of ProductShippingDimension with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

psdValue :: Lens' ProductShippingDimension (Maybe Double) Source #

The dimension of the product used to calculate the shipping cost of the item.

DatafeedsCustomBatchResponseEntry

data DatafeedsCustomBatchResponseEntry Source #

A batch entry encoding a single non-batch datafeeds response.

See: datafeedsCustomBatchResponseEntry smart constructor.

Instances
Eq DatafeedsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedsCustomBatchResponseEntry -> c DatafeedsCustomBatchResponseEntry #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedsCustomBatchResponseEntry #

toConstr :: DatafeedsCustomBatchResponseEntry -> Constr #

dataTypeOf :: DatafeedsCustomBatchResponseEntry -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedsCustomBatchResponseEntry) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedsCustomBatchResponseEntry) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedsCustomBatchResponseEntry -> DatafeedsCustomBatchResponseEntry #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsCustomBatchResponseEntry -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedsCustomBatchResponseEntry -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedsCustomBatchResponseEntry -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedsCustomBatchResponseEntry -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchResponseEntry -> m DatafeedsCustomBatchResponseEntry #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchResponseEntry -> m DatafeedsCustomBatchResponseEntry #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedsCustomBatchResponseEntry -> m DatafeedsCustomBatchResponseEntry #

Show DatafeedsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedsCustomBatchResponseEntry :: Type -> Type #

ToJSON DatafeedsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsCustomBatchResponseEntry Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedsCustomBatchResponseEntry = D1 (MetaData "DatafeedsCustomBatchResponseEntry" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedsCustomBatchResponseEntry'" PrefixI True) (S1 (MetaSel (Just "_dcbrecDatafeed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Datafeed)) :*: (S1 (MetaSel (Just "_dcbrecErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Errors)) :*: S1 (MetaSel (Just "_dcbrecBatchId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))))))

datafeedsCustomBatchResponseEntry :: DatafeedsCustomBatchResponseEntry Source #

Creates a value of DatafeedsCustomBatchResponseEntry with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dcbrecDatafeed :: Lens' DatafeedsCustomBatchResponseEntry (Maybe Datafeed) Source #

The requested data feed. Defined if and only if the request was successful.

dcbrecErrors :: Lens' DatafeedsCustomBatchResponseEntry (Maybe Errors) Source #

A list of errors defined if and only if the request failed.

dcbrecBatchId :: Lens' DatafeedsCustomBatchResponseEntry (Maybe Word32) Source #

The ID of the request entry this entry responds to.

DatafeedstatusesListResponse

data DatafeedstatusesListResponse Source #

Instances
Eq DatafeedstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data DatafeedstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatafeedstatusesListResponse -> c DatafeedstatusesListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatafeedstatusesListResponse #

toConstr :: DatafeedstatusesListResponse -> Constr #

dataTypeOf :: DatafeedstatusesListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatafeedstatusesListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatafeedstatusesListResponse) #

gmapT :: (forall b. Data b => b -> b) -> DatafeedstatusesListResponse -> DatafeedstatusesListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedstatusesListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatafeedstatusesListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatafeedstatusesListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatafeedstatusesListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatafeedstatusesListResponse -> m DatafeedstatusesListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedstatusesListResponse -> m DatafeedstatusesListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatafeedstatusesListResponse -> m DatafeedstatusesListResponse #

Show DatafeedstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic DatafeedstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep DatafeedstatusesListResponse :: Type -> Type #

ToJSON DatafeedstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON DatafeedstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep DatafeedstatusesListResponse = D1 (MetaData "DatafeedstatusesListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "DatafeedstatusesListResponse'" PrefixI True) (S1 (MetaSel (Just "_dlrlNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dlrlKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_dlrlResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DatafeedStatus])))))

datafeedstatusesListResponse :: DatafeedstatusesListResponse Source #

Creates a value of DatafeedstatusesListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dlrlNextPageToken :: Lens' DatafeedstatusesListResponse (Maybe Text) Source #

The token for the retrieval of the next page of datafeed statuses.

dlrlKind :: Lens' DatafeedstatusesListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#datafeedstatusesListResponse".

ProductsListResponse

data ProductsListResponse Source #

Instances
Eq ProductsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ProductsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProductsListResponse -> c ProductsListResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProductsListResponse #

toConstr :: ProductsListResponse -> Constr #

dataTypeOf :: ProductsListResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProductsListResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProductsListResponse) #

gmapT :: (forall b. Data b => b -> b) -> ProductsListResponse -> ProductsListResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProductsListResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProductsListResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProductsListResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProductsListResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProductsListResponse -> m ProductsListResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductsListResponse -> m ProductsListResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProductsListResponse -> m ProductsListResponse #

Show ProductsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ProductsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ProductsListResponse :: Type -> Type #

ToJSON ProductsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ProductsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsListResponse Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ProductsListResponse = D1 (MetaData "ProductsListResponse" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ProductsListResponse'" PrefixI True) (S1 (MetaSel (Just "_plr1NextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_plr1Kind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_plr1Resources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Product])))))

productsListResponse :: ProductsListResponse Source #

Creates a value of ProductsListResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

plr1NextPageToken :: Lens' ProductsListResponse (Maybe Text) Source #

The token for the retrieval of the next page of products.

plr1Kind :: Lens' ProductsListResponse Text Source #

Identifies what kind of resource this is. Value: the fixed string "content#productsListResponse".

ShipmentInvoice

data ShipmentInvoice Source #

Instances
Eq ShipmentInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data ShipmentInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShipmentInvoice -> c ShipmentInvoice #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShipmentInvoice #

toConstr :: ShipmentInvoice -> Constr #

dataTypeOf :: ShipmentInvoice -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShipmentInvoice) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShipmentInvoice) #

gmapT :: (forall b. Data b => b -> b) -> ShipmentInvoice -> ShipmentInvoice #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShipmentInvoice -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShipmentInvoice -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShipmentInvoice -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShipmentInvoice -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShipmentInvoice -> m ShipmentInvoice #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShipmentInvoice -> m ShipmentInvoice #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShipmentInvoice -> m ShipmentInvoice #

Show ShipmentInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic ShipmentInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep ShipmentInvoice :: Type -> Type #

ToJSON ShipmentInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON ShipmentInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShipmentInvoice Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep ShipmentInvoice = D1 (MetaData "ShipmentInvoice" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "ShipmentInvoice'" PrefixI True) (S1 (MetaSel (Just "_siShipmentGroupId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_siLineItemInvoices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ShipmentInvoiceLineItemInvoice])) :*: S1 (MetaSel (Just "_siInvoiceSummary") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InvoiceSummary)))))

shipmentInvoice :: ShipmentInvoice Source #

Creates a value of ShipmentInvoice with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

siShipmentGroupId :: Lens' ShipmentInvoice (Maybe Text) Source #

required
ID of the shipment group.

OrderCancellation

data OrderCancellation Source #

Instances
Eq OrderCancellation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Data OrderCancellation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderCancellation -> c OrderCancellation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderCancellation #

toConstr :: OrderCancellation -> Constr #

dataTypeOf :: OrderCancellation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderCancellation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderCancellation) #

gmapT :: (forall b. Data b => b -> b) -> OrderCancellation -> OrderCancellation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderCancellation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderCancellation -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderCancellation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderCancellation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderCancellation -> m OrderCancellation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderCancellation -> m OrderCancellation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderCancellation -> m OrderCancellation #

Show OrderCancellation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Generic OrderCancellation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

Associated Types

type Rep OrderCancellation :: Type -> Type #

ToJSON OrderCancellation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

FromJSON OrderCancellation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderCancellation Source # 
Instance details

Defined in Network.Google.ShoppingContent.Types.Product

type Rep OrderCancellation = D1 (MetaData "OrderCancellation" "Network.Google.ShoppingContent.Types.Product" "gogol-shopping-content-0.4.0-BIsXJOofTh8GkBklIAn8Hh" False) (C1 (MetaCons "OrderCancellation'" PrefixI True) ((S1 (MetaSel (Just "_ocQuantity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32))) :*: S1 (MetaSel (Just "_ocActor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ocReason") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ocCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ocReasonText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

orderCancellation :: OrderCancellation Source #

Creates a value of OrderCancellation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ocQuantity :: Lens' OrderCancellation (Maybe Word32) Source #

The quantity that was canceled.

ocActor :: Lens' OrderCancellation (Maybe Text) Source #

The actor that created the cancellation.

ocReason :: Lens' OrderCancellation (Maybe Text) Source #

The reason for the cancellation. Orders that are cancelled with a noInventory reason will lead to the removal of the product from Shopping Actions until you make an update to that product. This will not affect your Shopping ads.

ocCreationDate :: Lens' OrderCancellation (Maybe Text) Source #

Date on which the cancellation has been created, in ISO 8601 format.

ocReasonText :: Lens' OrderCancellation (Maybe Text) Source #

The explanation of the reason.