{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.AppsReseller
(
appsResellerService
, appsOrderReadOnlyScope
, appsOrderScope
, AppsResellerAPI
, module Network.Google.Resource.Reseller.Customers.Get
, module Network.Google.Resource.Reseller.Customers.Insert
, module Network.Google.Resource.Reseller.Customers.Patch
, module Network.Google.Resource.Reseller.Customers.Update
, module Network.Google.Resource.Reseller.Resellernotify.Getwatchdetails
, module Network.Google.Resource.Reseller.Resellernotify.Register
, module Network.Google.Resource.Reseller.Resellernotify.Unregister
, module Network.Google.Resource.Reseller.Subscriptions.Activate
, module Network.Google.Resource.Reseller.Subscriptions.ChangePlan
, module Network.Google.Resource.Reseller.Subscriptions.ChangeRenewalSettings
, module Network.Google.Resource.Reseller.Subscriptions.ChangeSeats
, module Network.Google.Resource.Reseller.Subscriptions.Delete
, module Network.Google.Resource.Reseller.Subscriptions.Get
, module Network.Google.Resource.Reseller.Subscriptions.Insert
, module Network.Google.Resource.Reseller.Subscriptions.List
, module Network.Google.Resource.Reseller.Subscriptions.StartPaidService
, module Network.Google.Resource.Reseller.Subscriptions.Suspend
, SubscriptionTrialSettings
, subscriptionTrialSettings
, stsIsInTrial
, stsTrialEndTime
, ResellernotifyResource
, resellernotifyResource
, rrTopicName
, ResellernotifyGetwatchdetailsResponse
, resellernotifyGetwatchdetailsResponse
, rgrTopicName
, rgrServiceAccountEmailAddresses
, Address
, address
, aOrganizationName
, aKind
, aPostalCode
, aAddressLine1
, aLocality
, aContactName
, aAddressLine2
, aCountryCode
, aRegion
, aAddressLine3
, Customer
, customer
, cCustomerDomainVerified
, cResourceUiURL
, cKind
, cCustomerId
, cAlternateEmail
, cCustomerDomain
, cPhoneNumber
, cPostalAddress
, ChangePlanRequest
, changePlanRequest
, cprKind
, cprDealCode
, cprPlanName
, cprPurchaseOrderId
, cprSeats
, SubscriptionPlanCommitmentInterval
, subscriptionPlanCommitmentInterval
, spciStartTime
, spciEndTime
, SubscriptionsDeleteDeletionType (..)
, SubscriptionPlan
, subscriptionPlan
, spCommitmentInterval
, spIsCommitmentPlan
, spPlanName
, Subscriptions
, subscriptions
, sNextPageToken
, sKind
, sSubscriptions
, Seats
, seats
, seaNumberOfSeats
, seaMaximumNumberOfSeats
, seaLicensedNumberOfSeats
, seaKind
, RenewalSettings
, renewalSettings
, rsKind
, rsRenewalType
, Subscription
, subscription
, subCreationTime
, subBillingMethod
, subStatus
, subTrialSettings
, subSKUName
, subResourceUiURL
, subKind
, subSKUId
, subPlan
, subDealCode
, subCustomerId
, subCustomerDomain
, subSuspensionReasons
, subTransferInfo
, subPurchaseOrderId
, subSeats
, subRenewalSettings
, subSubscriptionId
, SubscriptionTransferInfo
, subscriptionTransferInfo
, stiTransferabilityExpirationTime
, stiMinimumTransferableSeats
) where
import Network.Google.AppsReseller.Types
import Network.Google.Prelude
import Network.Google.Resource.Reseller.Customers.Get
import Network.Google.Resource.Reseller.Customers.Insert
import Network.Google.Resource.Reseller.Customers.Patch
import Network.Google.Resource.Reseller.Customers.Update
import Network.Google.Resource.Reseller.Resellernotify.Getwatchdetails
import Network.Google.Resource.Reseller.Resellernotify.Register
import Network.Google.Resource.Reseller.Resellernotify.Unregister
import Network.Google.Resource.Reseller.Subscriptions.Activate
import Network.Google.Resource.Reseller.Subscriptions.ChangePlan
import Network.Google.Resource.Reseller.Subscriptions.ChangeRenewalSettings
import Network.Google.Resource.Reseller.Subscriptions.ChangeSeats
import Network.Google.Resource.Reseller.Subscriptions.Delete
import Network.Google.Resource.Reseller.Subscriptions.Get
import Network.Google.Resource.Reseller.Subscriptions.Insert
import Network.Google.Resource.Reseller.Subscriptions.List
import Network.Google.Resource.Reseller.Subscriptions.StartPaidService
import Network.Google.Resource.Reseller.Subscriptions.Suspend
type AppsResellerAPI =
CustomersInsertResource :<|> CustomersPatchResource
:<|> CustomersGetResource
:<|> CustomersUpdateResource
:<|> ResellernotifyGetwatchdetailsResource
:<|> ResellernotifyRegisterResource
:<|> ResellernotifyUnregisterResource
:<|> SubscriptionsInsertResource
:<|> SubscriptionsListResource
:<|> SubscriptionsChangeRenewalSettingsResource
:<|> SubscriptionsGetResource
:<|> SubscriptionsActivateResource
:<|> SubscriptionsSuspendResource
:<|> SubscriptionsChangePlanResource
:<|> SubscriptionsChangeSeatsResource
:<|> SubscriptionsDeleteResource
:<|> SubscriptionsStartPaidServiceResource