gogol-androiddeviceprovisioning-0.4.0: Google Android Device Provisioning Partner 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.AndroidDeviceProvisioning.Types

Contents

Description

 
Synopsis

Service Configuration

androidDeviceProvisioningService :: ServiceConfig Source #

Default request referring to version v1 of the Android Device Provisioning Partner API. This contains the host and root path used as a starting point for constructing service requests.

UpdateMetadataArguments

data UpdateMetadataArguments Source #

Identifies metdata updates to one device.

See: updateMetadataArguments smart constructor.

Instances
Eq UpdateMetadataArguments Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data UpdateMetadataArguments Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: UpdateMetadataArguments -> Constr #

dataTypeOf :: UpdateMetadataArguments -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateMetadataArguments Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic UpdateMetadataArguments Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep UpdateMetadataArguments :: Type -> Type #

ToJSON UpdateMetadataArguments Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON UpdateMetadataArguments Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UpdateMetadataArguments Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UpdateMetadataArguments = D1 (MetaData "UpdateMetadataArguments" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "UpdateMetadataArguments'" PrefixI True) (S1 (MetaSel (Just "_umaDeviceIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceIdentifier)) :*: (S1 (MetaSel (Just "_umaDeviceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_umaDeviceMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceMetadata)))))

updateMetadataArguments :: UpdateMetadataArguments Source #

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

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

Status

data Status Source #

The `Status` type defines a logical error model that is suitable for different programming environments, including REST APIs and RPC APIs. It is used by gRPC. The error model is designed to be: - Simple to use and understand for most users - Flexible enough to meet unexpected needs # Overview The `Status` message contains three pieces of data: error code, error message, and error details. The error code should be an enum value of google.rpc.Code, but it may accept additional error codes if needed. The error message should be a developer-facing English message that helps developers *understand* and *resolve* the error. If a localized user-facing error message is needed, put the localized message in the error details or localize it in the client. The optional error details may contain arbitrary information about the error. There is a predefined set of error detail types in the package `google.rpc` that can be used for common error conditions. # Language mapping The `Status` message is the logical representation of the error model, but it is not necessarily the actual wire format. When the `Status` message is exposed in different client libraries and different wire protocols, it can be mapped differently. For example, it will likely be mapped to some exceptions in Java, but more likely mapped to some error codes in C. # Other uses The error model and the `Status` message can be used in a variety of environments, either with or without APIs, to provide a consistent developer experience across different environments. Example uses of this error model include: - Partial errors. If a service needs to return partial errors to the client, it may embed the `Status` in the normal response to indicate the partial errors. - Workflow errors. A typical workflow has multiple steps. Each step may have a `Status` message for error reporting. - Batch operations. If a client uses batch request and batch response, the `Status` message should be used directly inside batch response, one for each error sub-response. - Asynchronous operations. If an API call embeds asynchronous operation results in its response, the status of those operations should be represented directly using the `Status` message. - Logging. If some API errors are stored in logs, the message `Status` could be used directly after any stripping needed for security/privacy reasons.

See: status smart constructor.

Instances
Eq Status Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

Data Status Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: Status -> Constr #

dataTypeOf :: Status -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Status Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic Status Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep Status :: Type -> Type #

Methods

from :: Status -> Rep Status x #

to :: Rep Status x -> Status #

ToJSON Status Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON Status Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Status = D1 (MetaData "Status" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "Status'" PrefixI True) (S1 (MetaSel (Just "_sDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StatusDetailsItem])) :*: (S1 (MetaSel (Just "_sCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_sMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

status :: Status Source #

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

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

sDetails :: Lens' Status [StatusDetailsItem] Source #

A list of messages that carry the error details. There is a common set of message types for APIs to use.

sCode :: Lens' Status (Maybe Int32) Source #

The status code, which should be an enum value of google.rpc.Code.

sMessage :: Lens' Status (Maybe Text) Source #

A developer-facing error message, which should be in English. Any user-facing error message should be localized and sent in the google.rpc.Status.details field, or localized by the client.

PartnerClaim

data PartnerClaim Source #

Identifies one claim request.

See: partnerClaim smart constructor.

Instances
Eq PartnerClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data PartnerClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: PartnerClaim -> Constr #

dataTypeOf :: PartnerClaim -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PartnerClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic PartnerClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep PartnerClaim :: Type -> Type #

ToJSON PartnerClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON PartnerClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep PartnerClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep PartnerClaim = D1 (MetaData "PartnerClaim" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "PartnerClaim'" PrefixI True) ((S1 (MetaSel (Just "_pcDeviceIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceIdentifier)) :*: S1 (MetaSel (Just "_pcSectionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PartnerClaimSectionType))) :*: (S1 (MetaSel (Just "_pcCustomerId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_pcDeviceMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceMetadata)))))

partnerClaim :: PartnerClaim Source #

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

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

pcDeviceIdentifier :: Lens' PartnerClaim (Maybe DeviceIdentifier) Source #

Required. Device identifier of the device.

pcSectionType :: Lens' PartnerClaim (Maybe PartnerClaimSectionType) Source #

Required. The section type of the device's provisioning record.

pcCustomerId :: Lens' PartnerClaim (Maybe Int64) Source #

Required. The ID of the customer for whom the device is being claimed.

pcDeviceMetadata :: Lens' PartnerClaim (Maybe DeviceMetadata) Source #

Required. The metadata to attach to the device at claim.

CustomerUnclaimDeviceRequest

data CustomerUnclaimDeviceRequest Source #

Request message for customer to unclaim a device.

See: customerUnclaimDeviceRequest smart constructor.

Instances
Eq CustomerUnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data CustomerUnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: CustomerUnclaimDeviceRequest -> Constr #

dataTypeOf :: CustomerUnclaimDeviceRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CustomerUnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic CustomerUnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep CustomerUnclaimDeviceRequest :: Type -> Type #

ToJSON CustomerUnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON CustomerUnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerUnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerUnclaimDeviceRequest = D1 (MetaData "CustomerUnclaimDeviceRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "CustomerUnclaimDeviceRequest'" PrefixI True) (S1 (MetaSel (Just "_cudrDevice") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DeviceReference))))

customerUnclaimDeviceRequest :: CustomerUnclaimDeviceRequest Source #

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

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

PerDeviceStatusInBatchStatus

data PerDeviceStatusInBatchStatus Source #

The result status of the device after processing.

Constructors

SingleDeviceStatusUnspecified

SINGLE_DEVICE_STATUS_UNSPECIFIED Invalid code. Shouldn't be used.

SingleDeviceStatusUnknownError

SINGLE_DEVICE_STATUS_UNKNOWN_ERROR Unknown error. We don't expect this error to occur here.

SingleDeviceStatusOtherError

SINGLE_DEVICE_STATUS_OTHER_ERROR Other error. We know/expect this error, but there's no defined error code for the error.

SingleDeviceStatusSuccess

SINGLE_DEVICE_STATUS_SUCCESS Success.

SingleDeviceStatusPermissionDenied

SINGLE_DEVICE_STATUS_PERMISSION_DENIED Permission denied.

SingleDeviceStatusInvalidDeviceIdentifier

SINGLE_DEVICE_STATUS_INVALID_DEVICE_IDENTIFIER Invalid device identifier.

SingleDeviceStatusInvalidSectionType

SINGLE_DEVICE_STATUS_INVALID_SECTION_TYPE Invalid section type.

SingleDeviceStatusSectionNotYours

SINGLE_DEVICE_STATUS_SECTION_NOT_YOURS This section is claimed by another company.

Instances
Enum PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: PerDeviceStatusInBatchStatus -> Constr #

dataTypeOf :: PerDeviceStatusInBatchStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Associated Types

type Rep PerDeviceStatusInBatchStatus :: Type -> Type #

Hashable PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep PerDeviceStatusInBatchStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep PerDeviceStatusInBatchStatus = D1 (MetaData "PerDeviceStatusInBatchStatus" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (((C1 (MetaCons "SingleDeviceStatusUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SingleDeviceStatusUnknownError" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SingleDeviceStatusOtherError" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SingleDeviceStatusSuccess" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "SingleDeviceStatusPermissionDenied" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SingleDeviceStatusInvalidDeviceIdentifier" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SingleDeviceStatusInvalidSectionType" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SingleDeviceStatusSectionNotYours" PrefixI False) (U1 :: Type -> Type))))

FindDevicesByOwnerRequestSectionType

data FindDevicesByOwnerRequestSectionType Source #

Required. The section type of the device's provisioning record.

Constructors

SectionTypeUnspecified

SECTION_TYPE_UNSPECIFIED Unspecified section type.

SectionTypeSimLock

SECTION_TYPE_SIM_LOCK SIM-lock section type.

SectionTypeZeroTouch

SECTION_TYPE_ZERO_TOUCH Zero-touch enrollment section type.

Instances
Enum FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: FindDevicesByOwnerRequestSectionType -> Constr #

dataTypeOf :: FindDevicesByOwnerRequestSectionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Hashable FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep FindDevicesByOwnerRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep FindDevicesByOwnerRequestSectionType = D1 (MetaData "FindDevicesByOwnerRequestSectionType" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "SectionTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SectionTypeSimLock" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SectionTypeZeroTouch" PrefixI False) (U1 :: Type -> Type)))

FindDevicesByDeviceIdentifierRequest

data FindDevicesByDeviceIdentifierRequest Source #

Request to find devices.

See: findDevicesByDeviceIdentifierRequest smart constructor.

Instances
Eq FindDevicesByDeviceIdentifierRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data FindDevicesByDeviceIdentifierRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: FindDevicesByDeviceIdentifierRequest -> Constr #

dataTypeOf :: FindDevicesByDeviceIdentifierRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FindDevicesByDeviceIdentifierRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic FindDevicesByDeviceIdentifierRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

ToJSON FindDevicesByDeviceIdentifierRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON FindDevicesByDeviceIdentifierRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep FindDevicesByDeviceIdentifierRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep FindDevicesByDeviceIdentifierRequest = D1 (MetaData "FindDevicesByDeviceIdentifierRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "FindDevicesByDeviceIdentifierRequest'" PrefixI True) (S1 (MetaSel (Just "_fdbdirDeviceIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceIdentifier)) :*: (S1 (MetaSel (Just "_fdbdirLimit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_fdbdirPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

findDevicesByDeviceIdentifierRequest :: FindDevicesByDeviceIdentifierRequest Source #

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

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

fdbdirLimit :: Lens' FindDevicesByDeviceIdentifierRequest (Maybe Int64) Source #

Required. The maximum number of devices to show in a page of results. Must be between 1 and 100 inclusive.

fdbdirPageToken :: Lens' FindDevicesByDeviceIdentifierRequest (Maybe Text) Source #

A token specifying which result page to return.

FindDevicesByOwnerResponse

data FindDevicesByOwnerResponse Source #

Response containing found devices.

See: findDevicesByOwnerResponse smart constructor.

Instances
Eq FindDevicesByOwnerResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data FindDevicesByOwnerResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: FindDevicesByOwnerResponse -> Constr #

dataTypeOf :: FindDevicesByOwnerResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FindDevicesByOwnerResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic FindDevicesByOwnerResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep FindDevicesByOwnerResponse :: Type -> Type #

ToJSON FindDevicesByOwnerResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON FindDevicesByOwnerResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep FindDevicesByOwnerResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep FindDevicesByOwnerResponse = D1 (MetaData "FindDevicesByOwnerResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "FindDevicesByOwnerResponse'" PrefixI True) (S1 (MetaSel (Just "_fdborNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_fdborTotalSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_fdborDevices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Device])))))

findDevicesByOwnerResponse :: FindDevicesByOwnerResponse Source #

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

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

fdborNextPageToken :: Lens' FindDevicesByOwnerResponse (Maybe Text) Source #

A token used to access the next page of results. Omitted if no further results are available.

fdborTotalSize :: Lens' FindDevicesByOwnerResponse (Maybe Int32) Source #

The total count of items in the list irrespective of pagination.

DeviceMetadataEntries

data DeviceMetadataEntries Source #

Metadata entries recorded as key-value pairs.

See: deviceMetadataEntries smart constructor.

Instances
Eq DeviceMetadataEntries Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data DeviceMetadataEntries Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: DeviceMetadataEntries -> Constr #

dataTypeOf :: DeviceMetadataEntries -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeviceMetadataEntries Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic DeviceMetadataEntries Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep DeviceMetadataEntries :: Type -> Type #

ToJSON DeviceMetadataEntries Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON DeviceMetadataEntries Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceMetadataEntries Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceMetadataEntries = D1 (MetaData "DeviceMetadataEntries" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "DeviceMetadataEntries'" PrefixI True) (S1 (MetaSel (Just "_dmeAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

deviceMetadataEntries Source #

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

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

PartnerUnclaim

data PartnerUnclaim Source #

Identifies one unclaim request.

See: partnerUnclaim smart constructor.

Instances
Eq PartnerUnclaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data PartnerUnclaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: PartnerUnclaim -> Constr #

dataTypeOf :: PartnerUnclaim -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PartnerUnclaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic PartnerUnclaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep PartnerUnclaim :: Type -> Type #

ToJSON PartnerUnclaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON PartnerUnclaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep PartnerUnclaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep PartnerUnclaim = D1 (MetaData "PartnerUnclaim" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "PartnerUnclaim'" PrefixI True) (S1 (MetaSel (Just "_puDeviceIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceIdentifier)) :*: (S1 (MetaSel (Just "_puSectionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PartnerUnclaimSectionType)) :*: S1 (MetaSel (Just "_puDeviceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

partnerUnclaim :: PartnerUnclaim Source #

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

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

puSectionType :: Lens' PartnerUnclaim (Maybe PartnerUnclaimSectionType) Source #

Required. The section type of the device's provisioning record.

puDeviceId :: Lens' PartnerUnclaim (Maybe Int64) Source #

Device ID of the device.

Dpc

data Dpc Source #

An EMM's DPC ([device policy controller](http://developer.android.com/work/dpc/build-dpc.html)). Zero-touch enrollment installs a DPC (listed in the `Configuration`) on a device to maintain the customer's mobile policies. All the DPCs listed by the API support zero-touch enrollment and are available in Google Play.

See: dpc smart constructor.

Instances
Eq Dpc Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

Data Dpc Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: Dpc -> Constr #

dataTypeOf :: Dpc -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Dpc Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

showsPrec :: Int -> Dpc -> ShowS #

show :: Dpc -> String #

showList :: [Dpc] -> ShowS #

Generic Dpc Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep Dpc :: Type -> Type #

Methods

from :: Dpc -> Rep Dpc x #

to :: Rep Dpc x -> Dpc #

ToJSON Dpc Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON Dpc Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Dpc Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Dpc = D1 (MetaData "Dpc" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "Dpc'" PrefixI True) (S1 (MetaSel (Just "_dPackageName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dDpcName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

dpc :: Dpc Source #

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

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

dPackageName :: Lens' Dpc (Maybe Text) Source #

Output only. The DPC's Android application ID that looks like a Java package name. Zero-touch enrollment installs the DPC app onto a device using this identifier.

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

Output only. The API resource name in the format `customers/[CUSTOMER_ID]/dpcs/[DPC_ID]`. Assigned by the server. To maintain a reference to a DPC across customer accounts, persist and match the last path component (`DPC_ID`).

dDpcName :: Lens' Dpc (Maybe Text) Source #

Output only. The title of the DPC app in Google Play. For example, _Google Apps Device Policy_. Useful in an application's user interface.

ListVendorCustomersResponse

data ListVendorCustomersResponse Source #

Response message to list customers of the vendor.

See: listVendorCustomersResponse smart constructor.

Instances
Eq ListVendorCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data ListVendorCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: ListVendorCustomersResponse -> Constr #

dataTypeOf :: ListVendorCustomersResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListVendorCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic ListVendorCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep ListVendorCustomersResponse :: Type -> Type #

ToJSON ListVendorCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON ListVendorCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ListVendorCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ListVendorCustomersResponse = D1 (MetaData "ListVendorCustomersResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "ListVendorCustomersResponse'" PrefixI True) (S1 (MetaSel (Just "_lvcrCustomers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Company])) :*: (S1 (MetaSel (Just "_lvcrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lvcrTotalSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

listVendorCustomersResponse :: ListVendorCustomersResponse Source #

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

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

lvcrCustomers :: Lens' ListVendorCustomersResponse [Company] Source #

List of customers of the vendor.

lvcrNextPageToken :: Lens' ListVendorCustomersResponse (Maybe Text) Source #

A token to retrieve the next page of results. Omitted if no further results are available.

lvcrTotalSize :: Lens' ListVendorCustomersResponse (Maybe Int32) Source #

The total count of items in the list irrespective of pagination.

OperationPerDevice

data OperationPerDevice Source #

A task for each device in the operation. Corresponds to each device change in the request.

See: operationPerDevice smart constructor.

Instances
Eq OperationPerDevice Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data OperationPerDevice Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: OperationPerDevice -> Constr #

dataTypeOf :: OperationPerDevice -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationPerDevice Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic OperationPerDevice Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep OperationPerDevice :: Type -> Type #

ToJSON OperationPerDevice Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON OperationPerDevice Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep OperationPerDevice Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep OperationPerDevice = D1 (MetaData "OperationPerDevice" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "OperationPerDevice'" PrefixI True) ((S1 (MetaSel (Just "_opdUpdateMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateMetadataArguments)) :*: S1 (MetaSel (Just "_opdResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PerDeviceStatusInBatch))) :*: (S1 (MetaSel (Just "_opdClaim") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PartnerClaim)) :*: S1 (MetaSel (Just "_opdUnclaim") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PartnerUnclaim)))))

operationPerDevice :: OperationPerDevice Source #

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

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

opdUpdateMetadata :: Lens' OperationPerDevice (Maybe UpdateMetadataArguments) Source #

A copy of the original metadata-update request received by the server.

opdResult :: Lens' OperationPerDevice (Maybe PerDeviceStatusInBatch) Source #

The processing result for each device.

opdClaim :: Lens' OperationPerDevice (Maybe PartnerClaim) Source #

A copy of the original device-claim request received by the server.

opdUnclaim :: Lens' OperationPerDevice (Maybe PartnerUnclaim) Source #

A copy of the original device-unclaim request received by the server.

Operation

data Operation Source #

This resource represents a long-running operation that is the result of a network API call.

See: operation smart constructor.

Instances
Eq Operation Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data Operation Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: Operation -> Constr #

dataTypeOf :: Operation -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Operation Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic Operation Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Operation = D1 (MetaData "Operation" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "Operation'" PrefixI True) ((S1 (MetaSel (Just "_oDone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_oError") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Status))) :*: (S1 (MetaSel (Just "_oResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationResponse)) :*: (S1 (MetaSel (Just "_oName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationMetadata))))))

operation :: Operation Source #

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

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

oDone :: Lens' Operation (Maybe Bool) Source #

If the value is `false`, it means the operation is still in progress. If `true`, the operation is completed, and either `error` or `response` is available.

oError :: Lens' Operation (Maybe Status) Source #

This field will always be not set if the operation is created by `claimAsync`, `unclaimAsync`, or `updateMetadataAsync`. In this case, error information for each device is set in `response.perDeviceStatus.result.status`.

oResponse :: Lens' Operation (Maybe OperationResponse) Source #

This field will contain a `DevicesLongRunningOperationResponse` object if the operation is created by `claimAsync`, `unclaimAsync`, or `updateMetadataAsync`.

oName :: Lens' Operation (Maybe Text) Source #

The server-assigned name, which is only unique within the same service that originally returns it. If you use the default HTTP mapping, the `name` should have the format of `operations/some/unique/name`.

oMetadata :: Lens' Operation (Maybe OperationMetadata) Source #

This field will contain a `DevicesLongRunningOperationMetadata` object if the operation is created by `claimAsync`, `unclaimAsync`, or `updateMetadataAsync`.

Empty

data Empty Source #

A generic empty message that you can re-use to avoid defining duplicated empty messages in your APIs. A typical example is to use it as the request or the response type of an API method. For instance: service Foo { rpc Bar(google.protobuf.Empty) returns (google.protobuf.Empty); } The JSON representation for `Empty` is empty JSON object `{}`.

See: empty smart constructor.

Instances
Eq Empty Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

Data Empty Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: Empty -> Constr #

dataTypeOf :: Empty -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Empty Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep Empty :: Type -> Type #

Methods

from :: Empty -> Rep Empty x #

to :: Rep Empty x -> Empty #

ToJSON Empty Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON Empty Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "Empty'" PrefixI False) (U1 :: Type -> Type))

empty :: Empty Source #

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

PartnerClaimSectionType

data PartnerClaimSectionType Source #

Required. The section type of the device's provisioning record.

Constructors

PCSTSectionTypeUnspecified

SECTION_TYPE_UNSPECIFIED Unspecified section type.

PCSTSectionTypeSimLock

SECTION_TYPE_SIM_LOCK SIM-lock section type.

PCSTSectionTypeZeroTouch

SECTION_TYPE_ZERO_TOUCH Zero-touch enrollment section type.

Instances
Enum PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: PartnerClaimSectionType -> Constr #

dataTypeOf :: PartnerClaimSectionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Associated Types

type Rep PartnerClaimSectionType :: Type -> Type #

Hashable PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep PartnerClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep PartnerClaimSectionType = D1 (MetaData "PartnerClaimSectionType" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "PCSTSectionTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PCSTSectionTypeSimLock" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PCSTSectionTypeZeroTouch" PrefixI False) (U1 :: Type -> Type)))

PerDeviceStatusInBatch

data PerDeviceStatusInBatch Source #

Captures the processing status for each device in the operation.

See: perDeviceStatusInBatch smart constructor.

Instances
Eq PerDeviceStatusInBatch Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data PerDeviceStatusInBatch Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: PerDeviceStatusInBatch -> Constr #

dataTypeOf :: PerDeviceStatusInBatch -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PerDeviceStatusInBatch Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic PerDeviceStatusInBatch Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep PerDeviceStatusInBatch :: Type -> Type #

ToJSON PerDeviceStatusInBatch Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON PerDeviceStatusInBatch Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep PerDeviceStatusInBatch Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep PerDeviceStatusInBatch = D1 (MetaData "PerDeviceStatusInBatch" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "PerDeviceStatusInBatch'" PrefixI True) ((S1 (MetaSel (Just "_pdsibStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PerDeviceStatusInBatchStatus)) :*: S1 (MetaSel (Just "_pdsibErrorIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_pdsibDeviceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_pdsibErrorMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

perDeviceStatusInBatch :: PerDeviceStatusInBatch Source #

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

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

pdsibStatus :: Lens' PerDeviceStatusInBatch (Maybe PerDeviceStatusInBatchStatus) Source #

The result status of the device after processing.

pdsibErrorIdentifier :: Lens' PerDeviceStatusInBatch (Maybe Text) Source #

If processing fails, the error type.

pdsibDeviceId :: Lens' PerDeviceStatusInBatch (Maybe Int64) Source #

If processing succeeds, the device ID of the device.

pdsibErrorMessage :: Lens' PerDeviceStatusInBatch (Maybe Text) Source #

If processing fails, a developer message explaining what went wrong.

ClaimDevicesRequest

data ClaimDevicesRequest Source #

Request to claim devices asynchronously in batch. Claiming a device adds the device to zero-touch enrollment and shows the device in the customer's view of the portal.

See: claimDevicesRequest smart constructor.

Instances
Eq ClaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data ClaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: ClaimDevicesRequest -> Constr #

dataTypeOf :: ClaimDevicesRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ClaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic ClaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep ClaimDevicesRequest :: Type -> Type #

ToJSON ClaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON ClaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ClaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ClaimDevicesRequest = D1 (MetaData "ClaimDevicesRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "ClaimDevicesRequest'" PrefixI True) (S1 (MetaSel (Just "_cdrClaims") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [PartnerClaim]))))

claimDevicesRequest :: ClaimDevicesRequest Source #

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

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

cdrClaims :: Lens' ClaimDevicesRequest [PartnerClaim] Source #

Required. A list of device claims.

Device

data Device Source #

An Android device registered for zero-touch enrollment.

See: device smart constructor.

Instances
Eq Device Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

Data Device Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: Device -> Constr #

dataTypeOf :: Device -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Device Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic Device Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep Device :: Type -> Type #

Methods

from :: Device -> Rep Device x #

to :: Rep Device x -> Device #

ToJSON Device Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON Device Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Device Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Device = D1 (MetaData "Device" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "Device'" PrefixI True) ((S1 (MetaSel (Just "_devDeviceIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceIdentifier)) :*: (S1 (MetaSel (Just "_devClaims") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DeviceClaim])) :*: S1 (MetaSel (Just "_devName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_devDeviceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_devDeviceMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceMetadata)) :*: S1 (MetaSel (Just "_devConfiguration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

device :: Device Source #

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

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

devDeviceIdentifier :: Lens' Device (Maybe DeviceIdentifier) Source #

The hardware IDs that identify a manufactured device. To learn more, read Identifiers.

devClaims :: Lens' Device [DeviceClaim] Source #

Output only. The provisioning claims for a device. Devices claimed for zero-touch enrollment have a claim with the type `SECTION_TYPE_ZERO_TOUCH`. Call `partners.devices.unclaim` or `partners.devices.unclaimAsync` to remove the device from zero-touch enrollment.

devName :: Lens' Device (Maybe Text) Source #

Output only. The API resource name in the format `partners/[PARTNER_ID]/devices/[DEVICE_ID]`. Assigned by the server.

devDeviceId :: Lens' Device (Maybe Int64) Source #

Output only. The ID of the device. Assigned by the server.

devDeviceMetadata :: Lens' Device (Maybe DeviceMetadata) Source #

The metadata attached to the device. Structured as key-value pairs. To learn more, read Device metadata.

devConfiguration :: Lens' Device (Maybe Text) Source #

Not available to resellers.

ClaimDeviceRequest

data ClaimDeviceRequest Source #

Request message to claim a device on behalf of a customer.

See: claimDeviceRequest smart constructor.

Instances
Eq ClaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data ClaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: ClaimDeviceRequest -> Constr #

dataTypeOf :: ClaimDeviceRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ClaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic ClaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep ClaimDeviceRequest :: Type -> Type #

ToJSON ClaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON ClaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ClaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ClaimDeviceRequest = D1 (MetaData "ClaimDeviceRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "ClaimDeviceRequest'" PrefixI True) ((S1 (MetaSel (Just "_cdrDeviceIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceIdentifier)) :*: S1 (MetaSel (Just "_cdrSectionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ClaimDeviceRequestSectionType))) :*: (S1 (MetaSel (Just "_cdrCustomerId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_cdrDeviceMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceMetadata)))))

claimDeviceRequest :: ClaimDeviceRequest Source #

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

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

cdrDeviceIdentifier :: Lens' ClaimDeviceRequest (Maybe DeviceIdentifier) Source #

Required. The device identifier of the device to claim.

cdrSectionType :: Lens' ClaimDeviceRequest (Maybe ClaimDeviceRequestSectionType) Source #

Required. The section type of the device's provisioning record.

cdrCustomerId :: Lens' ClaimDeviceRequest (Maybe Int64) Source #

Required. The ID of the customer for whom the device is being claimed.

cdrDeviceMetadata :: Lens' ClaimDeviceRequest (Maybe DeviceMetadata) Source #

Optional. The metadata to attach to the device.

DeviceReference

data DeviceReference Source #

A `DeviceReference` is an API abstraction that lets you supply a _device_ argument to a method using one of the following identifier types: * A numeric API resource ID. * Real-world hardware IDs, such as IMEI number, belonging to the manufactured device. Methods that operate on devices take a `DeviceReference` as a parameter type because it's more flexible for the caller. To learn more about device identifiers, read Identifiers.

See: deviceReference smart constructor.

Instances
Eq DeviceReference Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data DeviceReference Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: DeviceReference -> Constr #

dataTypeOf :: DeviceReference -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeviceReference Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic DeviceReference Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep DeviceReference :: Type -> Type #

ToJSON DeviceReference Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON DeviceReference Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceReference Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceReference = D1 (MetaData "DeviceReference" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "DeviceReference'" PrefixI True) (S1 (MetaSel (Just "_drDeviceIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceIdentifier)) :*: S1 (MetaSel (Just "_drDeviceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))

deviceReference :: DeviceReference Source #

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

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

drDeviceId :: Lens' DeviceReference (Maybe Int64) Source #

The ID of the device.

CustomerRemoveConfigurationRequest

data CustomerRemoveConfigurationRequest Source #

Request message for customer to remove the configuration from device.

See: customerRemoveConfigurationRequest smart constructor.

Instances
Eq CustomerRemoveConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data CustomerRemoveConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: CustomerRemoveConfigurationRequest -> Constr #

dataTypeOf :: CustomerRemoveConfigurationRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CustomerRemoveConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic CustomerRemoveConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep CustomerRemoveConfigurationRequest :: Type -> Type #

ToJSON CustomerRemoveConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON CustomerRemoveConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerRemoveConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerRemoveConfigurationRequest = D1 (MetaData "CustomerRemoveConfigurationRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "CustomerRemoveConfigurationRequest'" PrefixI True) (S1 (MetaSel (Just "_crcrDevice") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DeviceReference))))

customerRemoveConfigurationRequest :: CustomerRemoveConfigurationRequest Source #

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

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

crcrDevice :: Lens' CustomerRemoveConfigurationRequest (Maybe DeviceReference) Source #

Required. The device to remove the configuration from.

DeviceIdentifier

data DeviceIdentifier Source #

Encapsulates hardware and product IDs to identify a manufactured device. To understand requirements on identifier sets, read Identifiers.

See: deviceIdentifier smart constructor.

Instances
Eq DeviceIdentifier Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data DeviceIdentifier Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: DeviceIdentifier -> Constr #

dataTypeOf :: DeviceIdentifier -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeviceIdentifier Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic DeviceIdentifier Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep DeviceIdentifier :: Type -> Type #

ToJSON DeviceIdentifier Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON DeviceIdentifier Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceIdentifier Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceIdentifier = D1 (MetaData "DeviceIdentifier" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "DeviceIdentifier'" PrefixI True) ((S1 (MetaSel (Just "_diManufacturer") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_diModel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_diMeid") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_diImei") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_diSerialNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

deviceIdentifier :: DeviceIdentifier Source #

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

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

diManufacturer :: Lens' DeviceIdentifier (Maybe Text) Source #

The device manufacturer’s name. Matches the device's built-in value returned from `android.os.Build.MANUFACTURER`. Allowed values are listed in manufacturers.

diModel :: Lens' DeviceIdentifier (Maybe Text) Source #

The device model's name. Matches the device's built-in value returned from `android.os.Build.MODEL`. Allowed values are listed in models.

diMeid :: Lens' DeviceIdentifier (Maybe Text) Source #

The device’s MEID number.

diImei :: Lens' DeviceIdentifier (Maybe Text) Source #

The device’s IMEI number. Validated on input.

diSerialNumber :: Lens' DeviceIdentifier (Maybe Text) Source #

The manufacturer's serial number for the device. This value might not be unique across different device models.

UnclaimDevicesRequest

data UnclaimDevicesRequest Source #

Request to unclaim devices asynchronously in batch.

See: unclaimDevicesRequest smart constructor.

Instances
Eq UnclaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data UnclaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: UnclaimDevicesRequest -> Constr #

dataTypeOf :: UnclaimDevicesRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UnclaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic UnclaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep UnclaimDevicesRequest :: Type -> Type #

ToJSON UnclaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON UnclaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UnclaimDevicesRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UnclaimDevicesRequest = D1 (MetaData "UnclaimDevicesRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "UnclaimDevicesRequest'" PrefixI True) (S1 (MetaSel (Just "_udrUnclaims") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [PartnerUnclaim]))))

unclaimDevicesRequest :: UnclaimDevicesRequest Source #

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

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

udrUnclaims :: Lens' UnclaimDevicesRequest [PartnerUnclaim] Source #

Required. The list of devices to unclaim.

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: StatusDetailsItem -> Constr #

dataTypeOf :: StatusDetailsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "StatusDetailsItem'" PrefixI True) (S1 (MetaSel (Just "_sdiAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

statusDetailsItem Source #

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

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

sdiAddtional :: Lens' StatusDetailsItem (HashMap Text JSONValue) Source #

Properties of the object. Contains field 'type with type URL.

ListVendorsResponse

data ListVendorsResponse Source #

Response message to list vendors of the partner.

See: listVendorsResponse smart constructor.

Instances
Eq ListVendorsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data ListVendorsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: ListVendorsResponse -> Constr #

dataTypeOf :: ListVendorsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListVendorsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic ListVendorsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep ListVendorsResponse :: Type -> Type #

ToJSON ListVendorsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON ListVendorsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ListVendorsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ListVendorsResponse = D1 (MetaData "ListVendorsResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "ListVendorsResponse'" PrefixI True) (S1 (MetaSel (Just "_lvrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_lvrTotalSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_lvrVendors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Company])))))

listVendorsResponse :: ListVendorsResponse Source #

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

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

lvrNextPageToken :: Lens' ListVendorsResponse (Maybe Text) Source #

A token to retrieve the next page of results. Omitted if no further results are available.

lvrTotalSize :: Lens' ListVendorsResponse (Maybe Int32) Source #

The total count of items in the list irrespective of pagination.

lvrVendors :: Lens' ListVendorsResponse [Company] Source #

List of vendors of the reseller partner. Fields `name`, `companyId` and `companyName` are populated to the Company object.

CustomerListConfigurationsResponse

data CustomerListConfigurationsResponse Source #

Response message of customer's listing configuration.

See: customerListConfigurationsResponse smart constructor.

Instances
Eq CustomerListConfigurationsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data CustomerListConfigurationsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: CustomerListConfigurationsResponse -> Constr #

dataTypeOf :: CustomerListConfigurationsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CustomerListConfigurationsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic CustomerListConfigurationsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep CustomerListConfigurationsResponse :: Type -> Type #

ToJSON CustomerListConfigurationsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON CustomerListConfigurationsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerListConfigurationsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerListConfigurationsResponse = D1 (MetaData "CustomerListConfigurationsResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "CustomerListConfigurationsResponse'" PrefixI True) (S1 (MetaSel (Just "_clcrConfigurations") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Configuration]))))

customerListConfigurationsResponse :: CustomerListConfigurationsResponse Source #

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

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

PartnerUnclaimSectionType

data PartnerUnclaimSectionType Source #

Required. The section type of the device's provisioning record.

Constructors

PUSTSectionTypeUnspecified

SECTION_TYPE_UNSPECIFIED Unspecified section type.

PUSTSectionTypeSimLock

SECTION_TYPE_SIM_LOCK SIM-lock section type.

PUSTSectionTypeZeroTouch

SECTION_TYPE_ZERO_TOUCH Zero-touch enrollment section type.

Instances
Enum PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: PartnerUnclaimSectionType -> Constr #

dataTypeOf :: PartnerUnclaimSectionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Associated Types

type Rep PartnerUnclaimSectionType :: Type -> Type #

Hashable PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep PartnerUnclaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep PartnerUnclaimSectionType = D1 (MetaData "PartnerUnclaimSectionType" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "PUSTSectionTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PUSTSectionTypeSimLock" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PUSTSectionTypeZeroTouch" PrefixI False) (U1 :: Type -> Type)))

CustomerApplyConfigurationRequest

data CustomerApplyConfigurationRequest Source #

Request message for customer to assign a configuration to device.

See: customerApplyConfigurationRequest smart constructor.

Instances
Eq CustomerApplyConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data CustomerApplyConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: CustomerApplyConfigurationRequest -> Constr #

dataTypeOf :: CustomerApplyConfigurationRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CustomerApplyConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic CustomerApplyConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep CustomerApplyConfigurationRequest :: Type -> Type #

ToJSON CustomerApplyConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON CustomerApplyConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerApplyConfigurationRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerApplyConfigurationRequest = D1 (MetaData "CustomerApplyConfigurationRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "CustomerApplyConfigurationRequest'" PrefixI True) (S1 (MetaSel (Just "_cacrDevice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceReference)) :*: S1 (MetaSel (Just "_cacrConfiguration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

customerApplyConfigurationRequest :: CustomerApplyConfigurationRequest Source #

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

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

cacrDevice :: Lens' CustomerApplyConfigurationRequest (Maybe DeviceReference) Source #

Required. The device the configuration is applied to.

cacrConfiguration :: Lens' CustomerApplyConfigurationRequest (Maybe Text) Source #

Required. The configuration applied to the device in the format `customers/[CUSTOMER_ID]/configurations/[CONFIGURATION_ID]`.

Company

data Company Source #

A reseller, vendor, or customer in the zero-touch reseller and customer APIs.

See: company smart constructor.

Instances
Eq Company Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

Data Company Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: Company -> Constr #

dataTypeOf :: Company -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Company Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic Company Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep Company :: Type -> Type #

Methods

from :: Company -> Rep Company x #

to :: Rep Company x -> Company #

ToJSON Company Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON Company Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Company Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Company = D1 (MetaData "Company" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "Company'" PrefixI True) ((S1 (MetaSel (Just "_cCompanyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_cCompanyName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cOwnerEmails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))) :*: (S1 (MetaSel (Just "_cTermsStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CompanyTermsStatus)) :*: (S1 (MetaSel (Just "_cName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cAdminEmails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))))

company :: Company Source #

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

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

cCompanyId :: Lens' Company (Maybe Int64) Source #

Output only. The ID of the company. Assigned by the server.

cCompanyName :: Lens' Company (Maybe Text) Source #

Required. The name of the company. For example _XYZ Corp_. Displayed to the company's employees in the zero-touch enrollment portal.

cOwnerEmails :: Lens' Company [Text] Source #

Input only. Email address of customer's users in the owner role. At least one `owner_email` is required. Each email address must be associated with a Google Account. Owners share the same access as admins but can also add, delete, and edit your organization's portal users.

cTermsStatus :: Lens' Company (Maybe CompanyTermsStatus) Source #

Output only. Whether any user from the company has accepted the latest Terms of Service (ToS). See TermsStatus.

cName :: Lens' Company (Maybe Text) Source #

Output only. The API resource name of the company. The resource name is one of the following formats: * `partners/[PARTNER_ID]/customers/[CUSTOMER_ID]` * `partners/[PARTNER_ID]/vendors/[VENDOR_ID]` * `partners/[PARTNER_ID]/vendors/[VENDOR_ID]/customers/[CUSTOMER_ID]` Assigned by the server.

cAdminEmails :: Lens' Company [Text] Source #

Input only. Optional. Email address of customer's users in the admin role. Each email address must be associated with a Google Account.

Xgafv

data Xgafv Source #

V1 error format.

Constructors

X1

1 v1 error format

X2

2 v2 error format

Instances
Enum Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: Xgafv -> Constr #

dataTypeOf :: Xgafv -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

compare :: Xgafv -> Xgafv -> Ordering #

(<) :: Xgafv -> Xgafv -> Bool #

(<=) :: Xgafv -> Xgafv -> Bool #

(>) :: Xgafv -> Xgafv -> Bool #

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

max :: Xgafv -> Xgafv -> Xgafv #

min :: Xgafv -> Xgafv -> Xgafv #

Read Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Associated Types

type Rep Xgafv :: Type -> Type #

Methods

from :: Xgafv -> Rep Xgafv x #

to :: Rep Xgafv x -> Xgafv #

Hashable Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

ClaimDeviceRequestSectionType

data ClaimDeviceRequestSectionType Source #

Required. The section type of the device's provisioning record.

Constructors

CDRSTSectionTypeUnspecified

SECTION_TYPE_UNSPECIFIED Unspecified section type.

CDRSTSectionTypeSimLock

SECTION_TYPE_SIM_LOCK SIM-lock section type.

CDRSTSectionTypeZeroTouch

SECTION_TYPE_ZERO_TOUCH Zero-touch enrollment section type.

Instances
Enum ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: ClaimDeviceRequestSectionType -> Constr #

dataTypeOf :: ClaimDeviceRequestSectionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Associated Types

type Rep ClaimDeviceRequestSectionType :: Type -> Type #

Hashable ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep ClaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep ClaimDeviceRequestSectionType = D1 (MetaData "ClaimDeviceRequestSectionType" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "CDRSTSectionTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CDRSTSectionTypeSimLock" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CDRSTSectionTypeZeroTouch" PrefixI False) (U1 :: Type -> Type)))

CustomerListCustomersResponse

data CustomerListCustomersResponse Source #

Response message for listing my customers.

See: customerListCustomersResponse smart constructor.

Instances
Eq CustomerListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data CustomerListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: CustomerListCustomersResponse -> Constr #

dataTypeOf :: CustomerListCustomersResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CustomerListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic CustomerListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep CustomerListCustomersResponse :: Type -> Type #

ToJSON CustomerListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON CustomerListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerListCustomersResponse = D1 (MetaData "CustomerListCustomersResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "CustomerListCustomersResponse'" PrefixI True) (S1 (MetaSel (Just "_clcrCustomers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Company])) :*: S1 (MetaSel (Just "_clcrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

customerListCustomersResponse :: CustomerListCustomersResponse Source #

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

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

clcrCustomers :: Lens' CustomerListCustomersResponse [Company] Source #

The customer accounts the calling user is a member of.

clcrNextPageToken :: Lens' CustomerListCustomersResponse (Maybe Text) Source #

A token used to access the next page of results. Omitted if no further results are available.

DeviceClaim

data DeviceClaim Source #

A record of a device claimed by a reseller for a customer. Devices claimed for zero-touch enrollment have a claim with the type `SECTION_TYPE_ZERO_TOUCH`. To learn more, read Claim devices for customers.

See: deviceClaim smart constructor.

Instances
Eq DeviceClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data DeviceClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: DeviceClaim -> Constr #

dataTypeOf :: DeviceClaim -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeviceClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic DeviceClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep DeviceClaim :: Type -> Type #

ToJSON DeviceClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON DeviceClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceClaim Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceClaim = D1 (MetaData "DeviceClaim" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "DeviceClaim'" PrefixI True) (S1 (MetaSel (Just "_dcSectionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceClaimSectionType)) :*: (S1 (MetaSel (Just "_dcOwnerCompanyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_dcResellerId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

deviceClaim :: DeviceClaim Source #

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

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

dcSectionType :: Lens' DeviceClaim (Maybe DeviceClaimSectionType) Source #

Output only. The type of claim made on the device.

dcOwnerCompanyId :: Lens' DeviceClaim (Maybe Int64) Source #

The ID of the Customer that purchased the device.

dcResellerId :: Lens' DeviceClaim (Maybe Int64) Source #

The ID of the reseller that claimed the device.

UpdateDeviceMetadataRequest

data UpdateDeviceMetadataRequest Source #

Request to set metadata for a device.

See: updateDeviceMetadataRequest smart constructor.

Instances
Eq UpdateDeviceMetadataRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data UpdateDeviceMetadataRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: UpdateDeviceMetadataRequest -> Constr #

dataTypeOf :: UpdateDeviceMetadataRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateDeviceMetadataRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic UpdateDeviceMetadataRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep UpdateDeviceMetadataRequest :: Type -> Type #

ToJSON UpdateDeviceMetadataRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON UpdateDeviceMetadataRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UpdateDeviceMetadataRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UpdateDeviceMetadataRequest = D1 (MetaData "UpdateDeviceMetadataRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "UpdateDeviceMetadataRequest'" PrefixI True) (S1 (MetaSel (Just "_udmrDeviceMetadata") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DeviceMetadata))))

updateDeviceMetadataRequest :: UpdateDeviceMetadataRequest Source #

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

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

udmrDeviceMetadata :: Lens' UpdateDeviceMetadataRequest (Maybe DeviceMetadata) Source #

Required. The metdata to attach to the device.

DeviceMetadata

data DeviceMetadata Source #

Metadata entries that can be attached to a `Device`. To learn more, read Device metadata.

See: deviceMetadata smart constructor.

Instances
Eq DeviceMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data DeviceMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: DeviceMetadata -> Constr #

dataTypeOf :: DeviceMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeviceMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic DeviceMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep DeviceMetadata :: Type -> Type #

ToJSON DeviceMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON DeviceMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DeviceMetadata = D1 (MetaData "DeviceMetadata" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "DeviceMetadata'" PrefixI True) (S1 (MetaSel (Just "_dmEntries") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DeviceMetadataEntries))))

deviceMetadata :: DeviceMetadata Source #

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

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

dmEntries :: Lens' DeviceMetadata (Maybe DeviceMetadataEntries) Source #

Metadata entries recorded as key-value pairs.

FindDevicesByOwnerRequest

data FindDevicesByOwnerRequest Source #

Request to find devices by customers.

See: findDevicesByOwnerRequest smart constructor.

Instances
Eq FindDevicesByOwnerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data FindDevicesByOwnerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: FindDevicesByOwnerRequest -> Constr #

dataTypeOf :: FindDevicesByOwnerRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FindDevicesByOwnerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic FindDevicesByOwnerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep FindDevicesByOwnerRequest :: Type -> Type #

ToJSON FindDevicesByOwnerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON FindDevicesByOwnerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep FindDevicesByOwnerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep FindDevicesByOwnerRequest = D1 (MetaData "FindDevicesByOwnerRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "FindDevicesByOwnerRequest'" PrefixI True) ((S1 (MetaSel (Just "_fdborSectionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FindDevicesByOwnerRequestSectionType)) :*: S1 (MetaSel (Just "_fdborCustomerId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Textual Int64]))) :*: (S1 (MetaSel (Just "_fdborLimit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_fdborPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

findDevicesByOwnerRequest :: FindDevicesByOwnerRequest Source #

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

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

fdborSectionType :: Lens' FindDevicesByOwnerRequest (Maybe FindDevicesByOwnerRequestSectionType) Source #

Required. The section type of the device's provisioning record.

fdborCustomerId :: Lens' FindDevicesByOwnerRequest [Int64] Source #

Required. The list of customer IDs to search for.

fdborLimit :: Lens' FindDevicesByOwnerRequest (Maybe Int64) Source #

Required. The maximum number of devices to show in a page of results. Must be between 1 and 100 inclusive.

fdborPageToken :: Lens' FindDevicesByOwnerRequest (Maybe Text) Source #

A token specifying which result page to return.

FindDevicesByDeviceIdentifierResponse

data FindDevicesByDeviceIdentifierResponse Source #

Response containing found devices.

See: findDevicesByDeviceIdentifierResponse smart constructor.

Instances
Eq FindDevicesByDeviceIdentifierResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data FindDevicesByDeviceIdentifierResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: FindDevicesByDeviceIdentifierResponse -> Constr #

dataTypeOf :: FindDevicesByDeviceIdentifierResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FindDevicesByDeviceIdentifierResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic FindDevicesByDeviceIdentifierResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

ToJSON FindDevicesByDeviceIdentifierResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON FindDevicesByDeviceIdentifierResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep FindDevicesByDeviceIdentifierResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep FindDevicesByDeviceIdentifierResponse = D1 (MetaData "FindDevicesByDeviceIdentifierResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "FindDevicesByDeviceIdentifierResponse'" PrefixI True) (S1 (MetaSel (Just "_fdbdirNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_fdbdirTotalSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_fdbdirDevices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Device])))))

findDevicesByDeviceIdentifierResponse :: FindDevicesByDeviceIdentifierResponse Source #

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

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

fdbdirNextPageToken :: Lens' FindDevicesByDeviceIdentifierResponse (Maybe Text) Source #

A token used to access the next page of results. Omitted if no further results are available.

fdbdirTotalSize :: Lens' FindDevicesByDeviceIdentifierResponse (Maybe Int32) Source #

The total count of items in the list irrespective of pagination.

UnclaimDeviceRequest

data UnclaimDeviceRequest Source #

Request message to unclaim a device.

See: unclaimDeviceRequest smart constructor.

Instances
Eq UnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data UnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: UnclaimDeviceRequest -> Constr #

dataTypeOf :: UnclaimDeviceRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic UnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep UnclaimDeviceRequest :: Type -> Type #

ToJSON UnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON UnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UnclaimDeviceRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UnclaimDeviceRequest = D1 (MetaData "UnclaimDeviceRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "UnclaimDeviceRequest'" PrefixI True) (S1 (MetaSel (Just "_udrDeviceIdentifier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceIdentifier)) :*: (S1 (MetaSel (Just "_udrSectionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UnclaimDeviceRequestSectionType)) :*: S1 (MetaSel (Just "_udrDeviceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

unclaimDeviceRequest :: UnclaimDeviceRequest Source #

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

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

udrDeviceIdentifier :: Lens' UnclaimDeviceRequest (Maybe DeviceIdentifier) Source #

The device identifier you used when you claimed this device.

udrSectionType :: Lens' UnclaimDeviceRequest (Maybe UnclaimDeviceRequestSectionType) Source #

Required. The section type of the device's provisioning record.

udrDeviceId :: Lens' UnclaimDeviceRequest (Maybe Int64) Source #

The device ID returned by `ClaimDevice`.

DevicesLongRunningOperationResponse

data DevicesLongRunningOperationResponse Source #

Tracks the status of a long-running operation to claim, unclaim, or attach metadata to devices. To learn more, read Long‑running batch operations.

See: devicesLongRunningOperationResponse smart constructor.

Instances
Eq DevicesLongRunningOperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data DevicesLongRunningOperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: DevicesLongRunningOperationResponse -> Constr #

dataTypeOf :: DevicesLongRunningOperationResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DevicesLongRunningOperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic DevicesLongRunningOperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

ToJSON DevicesLongRunningOperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON DevicesLongRunningOperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DevicesLongRunningOperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DevicesLongRunningOperationResponse = D1 (MetaData "DevicesLongRunningOperationResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "DevicesLongRunningOperationResponse'" PrefixI True) (S1 (MetaSel (Just "_dlrorSuccessCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_dlrorPerDeviceStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OperationPerDevice]))))

devicesLongRunningOperationResponse :: DevicesLongRunningOperationResponse Source #

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

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

dlrorSuccessCount :: Lens' DevicesLongRunningOperationResponse (Maybe Int32) Source #

A summary of how many items in the operation the server processed successfully. Updated as the operation progresses.

dlrorPerDeviceStatus :: Lens' DevicesLongRunningOperationResponse [OperationPerDevice] Source #

The processing status for each device in the operation. One `PerDeviceStatus` per device. The list order matches the items in the original request.

Configuration

data Configuration Source #

A configuration collects the provisioning options for Android devices. Each configuration combines the following: * The EMM device policy controller (DPC) installed on the devices. * EMM policies enforced on the devices. * Metadata displayed on the device to help users during setup. Customers can add as many configurations as they need. However, zero-touch enrollment works best when a customer sets a default configuration that's applied to any new devices the organization purchases.

See: configuration smart constructor.

Instances
Eq Configuration Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data Configuration Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: Configuration -> Constr #

dataTypeOf :: Configuration -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Configuration Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic Configuration Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep Configuration :: Type -> Type #

ToJSON Configuration Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON Configuration Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Configuration Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep Configuration = D1 (MetaData "Configuration" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "Configuration'" PrefixI True) (((S1 (MetaSel (Just "_conContactPhone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_conContactEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_conConfigurationName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conConfigurationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_conCustomMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_conCompanyName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_conDpcExtras") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_conName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_conDpcResourcePath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_conIsDefault") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

configuration :: Configuration Source #

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

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

conContactPhone :: Lens' Configuration (Maybe Text) Source #

Required. The telephone number that device users can call, using another device, to get help. Zero-touch enrollment shows this number to device users before device provisioning. Accepts numerals, spaces, the plus sign, hyphens, and parentheses.

conContactEmail :: Lens' Configuration (Maybe Text) Source #

Required. The email address that device users can contact to get help. Zero-touch enrollment shows this email address to device users before device provisioning. The value is validated on input.

conConfigurationName :: Lens' Configuration (Maybe Text) Source #

Required. A short name that describes the configuration's purpose. For example, _Sales team_ or _Temporary employees_. The zero-touch enrollment portal displays this name to IT admins.

conConfigurationId :: Lens' Configuration (Maybe Int64) Source #

Output only. The ID of the configuration. Assigned by the server.

conCustomMessage :: Lens' Configuration (Maybe Text) Source #

A message, containing one or two sentences, to help device users get help or give them more details about what’s happening to their device. Zero-touch enrollment shows this message before the device is provisioned.

conCompanyName :: Lens' Configuration (Maybe Text) Source #

Required. The name of the organization. Zero-touch enrollment shows this organization name to device users during device provisioning.

conDpcExtras :: Lens' Configuration (Maybe Text) Source #

The JSON-formatted EMM provisioning extras that are passed to the DPC.

conName :: Lens' Configuration (Maybe Text) Source #

Output only. The API resource name in the format `customers/[CUSTOMER_ID]/configurations/[CONFIGURATION_ID]`. Assigned by the server.

conDpcResourcePath :: Lens' Configuration (Maybe Text) Source #

Required. The resource name of the selected DPC (device policy controller) in the format `customers/[CUSTOMER_ID]/dpcs/*`. To list the supported DPCs, call `customers.dpcs.list`.

conIsDefault :: Lens' Configuration (Maybe Bool) Source #

Required. Whether this is the default configuration that zero-touch enrollment applies to any new devices the organization purchases in the future. Only one customer configuration can be the default. Setting this value to `true`, changes the previous default configuration's `isDefault` value to `false`.

OperationMetadata

data OperationMetadata Source #

This field will contain a `DevicesLongRunningOperationMetadata` object if the operation is created by `claimAsync`, `unclaimAsync`, or `updateMetadataAsync`.

See: operationMetadata smart constructor.

Instances
Eq OperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data OperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: OperationMetadata -> Constr #

dataTypeOf :: OperationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic OperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep OperationMetadata :: Type -> Type #

ToJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep OperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep OperationMetadata = D1 (MetaData "OperationMetadata" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "OperationMetadata'" PrefixI True) (S1 (MetaSel (Just "_omAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationMetadata Source #

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

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

omAddtional :: Lens' OperationMetadata (HashMap Text JSONValue) Source #

Properties of the object. Contains field 'type with type URL.

DeviceClaimSectionType

data DeviceClaimSectionType Source #

Output only. The type of claim made on the device.

Constructors

DCSTSectionTypeUnspecified

SECTION_TYPE_UNSPECIFIED Unspecified section type.

DCSTSectionTypeSimLock

SECTION_TYPE_SIM_LOCK SIM-lock section type.

DCSTSectionTypeZeroTouch

SECTION_TYPE_ZERO_TOUCH Zero-touch enrollment section type.

Instances
Enum DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: DeviceClaimSectionType -> Constr #

dataTypeOf :: DeviceClaimSectionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Associated Types

type Rep DeviceClaimSectionType :: Type -> Type #

Hashable DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep DeviceClaimSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep DeviceClaimSectionType = D1 (MetaData "DeviceClaimSectionType" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "DCSTSectionTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DCSTSectionTypeSimLock" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DCSTSectionTypeZeroTouch" PrefixI False) (U1 :: Type -> Type)))

ListCustomersResponse

data ListCustomersResponse Source #

Response message of all customers related to this partner.

See: listCustomersResponse smart constructor.

Instances
Eq ListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data ListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: ListCustomersResponse -> Constr #

dataTypeOf :: ListCustomersResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic ListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep ListCustomersResponse :: Type -> Type #

ToJSON ListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON ListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ListCustomersResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ListCustomersResponse = D1 (MetaData "ListCustomersResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "ListCustomersResponse'" PrefixI True) (S1 (MetaSel (Just "_lcrCustomers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Company])) :*: (S1 (MetaSel (Just "_lcrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lcrTotalSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

listCustomersResponse :: ListCustomersResponse Source #

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

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

lcrCustomers :: Lens' ListCustomersResponse [Company] Source #

List of customers related to this reseller partner.

lcrNextPageToken :: Lens' ListCustomersResponse (Maybe Text) Source #

A token to retrieve the next page of results. Omitted if no further results are available.

lcrTotalSize :: Lens' ListCustomersResponse (Maybe Int32) Source #

The total count of items in the list irrespective of pagination.

DevicesLongRunningOperationMetadata

data DevicesLongRunningOperationMetadata Source #

Tracks the status of a long-running operation to asynchronously update a batch of reseller metadata attached to devices. To learn more, read Long‑running batch operations.

See: devicesLongRunningOperationMetadata smart constructor.

Instances
Eq DevicesLongRunningOperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data DevicesLongRunningOperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: DevicesLongRunningOperationMetadata -> Constr #

dataTypeOf :: DevicesLongRunningOperationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DevicesLongRunningOperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic DevicesLongRunningOperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

ToJSON DevicesLongRunningOperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON DevicesLongRunningOperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DevicesLongRunningOperationMetadata Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep DevicesLongRunningOperationMetadata = D1 (MetaData "DevicesLongRunningOperationMetadata" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "DevicesLongRunningOperationMetadata'" PrefixI True) (S1 (MetaSel (Just "_dlromProgress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_dlromDevicesCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_dlromProcessingStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DevicesLongRunningOperationMetadataProcessingStatus)))))

devicesLongRunningOperationMetadata :: DevicesLongRunningOperationMetadata Source #

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

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

dlromProgress :: Lens' DevicesLongRunningOperationMetadata (Maybe Int32) Source #

The processing progress of the operation. Measured as a number from 0 to 100. A value of 10O doesnt always mean the operation completed—check for the inclusion of a `done` field.

dlromDevicesCount :: Lens' DevicesLongRunningOperationMetadata (Maybe Int32) Source #

The number of metadata updates in the operation. This might be different from the number of updates in the request if the API can't parse some of the updates.

OperationResponse

data OperationResponse Source #

This field will contain a `DevicesLongRunningOperationResponse` object if the operation is created by `claimAsync`, `unclaimAsync`, or `updateMetadataAsync`.

See: operationResponse smart constructor.

Instances
Eq OperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data OperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: OperationResponse -> Constr #

dataTypeOf :: OperationResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic OperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep OperationResponse :: Type -> Type #

ToJSON OperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON OperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep OperationResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "OperationResponse'" PrefixI True) (S1 (MetaSel (Just "_orAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationResponse Source #

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

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

orAddtional :: Lens' OperationResponse (HashMap Text JSONValue) Source #

Properties of the object. Contains field 'type with type URL.

CompanyTermsStatus

data CompanyTermsStatus Source #

Output only. Whether any user from the company has accepted the latest Terms of Service (ToS). See TermsStatus.

Constructors

TermsStatusUnspecified

TERMS_STATUS_UNSPECIFIED Default value. This value should never be set if the enum is present.

TermsStatusNotAccepted

TERMS_STATUS_NOT_ACCEPTED None of the company's users have accepted the ToS.

TermsStatusAccepted

TERMS_STATUS_ACCEPTED One (or more) of the company's users has accepted the ToS.

TermsStatusStale

TERMS_STATUS_STALE None of the company's users has accepted the current ToS but at least one user accepted a previous ToS.

Instances
Enum CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: CompanyTermsStatus -> Constr #

dataTypeOf :: CompanyTermsStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Associated Types

type Rep CompanyTermsStatus :: Type -> Type #

Hashable CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep CompanyTermsStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep CompanyTermsStatus = D1 (MetaData "CompanyTermsStatus" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) ((C1 (MetaCons "TermsStatusUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TermsStatusNotAccepted" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TermsStatusAccepted" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TermsStatusStale" PrefixI False) (U1 :: Type -> Type)))

CustomerListDevicesResponse

data CustomerListDevicesResponse Source #

Response message of customer's liting devices.

See: customerListDevicesResponse smart constructor.

Instances
Eq CustomerListDevicesResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data CustomerListDevicesResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: CustomerListDevicesResponse -> Constr #

dataTypeOf :: CustomerListDevicesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CustomerListDevicesResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic CustomerListDevicesResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep CustomerListDevicesResponse :: Type -> Type #

ToJSON CustomerListDevicesResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON CustomerListDevicesResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerListDevicesResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerListDevicesResponse = D1 (MetaData "CustomerListDevicesResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "CustomerListDevicesResponse'" PrefixI True) (S1 (MetaSel (Just "_cldrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cldrDevices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Device]))))

customerListDevicesResponse :: CustomerListDevicesResponse Source #

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

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

cldrNextPageToken :: Lens' CustomerListDevicesResponse (Maybe Text) Source #

A token used to access the next page of results. Omitted if no further results are available.

UpdateDeviceMetadataInBatchRequest

data UpdateDeviceMetadataInBatchRequest Source #

Request to update device metadata in batch.

See: updateDeviceMetadataInBatchRequest smart constructor.

Instances
Eq UpdateDeviceMetadataInBatchRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data UpdateDeviceMetadataInBatchRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: UpdateDeviceMetadataInBatchRequest -> Constr #

dataTypeOf :: UpdateDeviceMetadataInBatchRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateDeviceMetadataInBatchRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic UpdateDeviceMetadataInBatchRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep UpdateDeviceMetadataInBatchRequest :: Type -> Type #

ToJSON UpdateDeviceMetadataInBatchRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON UpdateDeviceMetadataInBatchRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UpdateDeviceMetadataInBatchRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep UpdateDeviceMetadataInBatchRequest = D1 (MetaData "UpdateDeviceMetadataInBatchRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "UpdateDeviceMetadataInBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_udmibrUpdates") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [UpdateMetadataArguments]))))

updateDeviceMetadataInBatchRequest :: UpdateDeviceMetadataInBatchRequest Source #

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

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

UnclaimDeviceRequestSectionType

data UnclaimDeviceRequestSectionType Source #

Required. The section type of the device's provisioning record.

Constructors

UDRSTSectionTypeUnspecified

SECTION_TYPE_UNSPECIFIED Unspecified section type.

UDRSTSectionTypeSimLock

SECTION_TYPE_SIM_LOCK SIM-lock section type.

UDRSTSectionTypeZeroTouch

SECTION_TYPE_ZERO_TOUCH Zero-touch enrollment section type.

Instances
Enum UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: UnclaimDeviceRequestSectionType -> Constr #

dataTypeOf :: UnclaimDeviceRequestSectionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Associated Types

type Rep UnclaimDeviceRequestSectionType :: Type -> Type #

Hashable UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep UnclaimDeviceRequestSectionType Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep UnclaimDeviceRequestSectionType = D1 (MetaData "UnclaimDeviceRequestSectionType" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "UDRSTSectionTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "UDRSTSectionTypeSimLock" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "UDRSTSectionTypeZeroTouch" PrefixI False) (U1 :: Type -> Type)))

CustomerListDpcsResponse

data CustomerListDpcsResponse Source #

Response message of customer's listing DPCs.

See: customerListDpcsResponse smart constructor.

Instances
Eq CustomerListDpcsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data CustomerListDpcsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: CustomerListDpcsResponse -> Constr #

dataTypeOf :: CustomerListDpcsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CustomerListDpcsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic CustomerListDpcsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep CustomerListDpcsResponse :: Type -> Type #

ToJSON CustomerListDpcsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON CustomerListDpcsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerListDpcsResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CustomerListDpcsResponse = D1 (MetaData "CustomerListDpcsResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "CustomerListDpcsResponse'" PrefixI True) (S1 (MetaSel (Just "_cldrDpcs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Dpc]))))

customerListDpcsResponse :: CustomerListDpcsResponse Source #

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

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

cldrDpcs :: Lens' CustomerListDpcsResponse [Dpc] Source #

The list of DPCs available to the customer that support zero-touch enrollment.

ClaimDeviceResponse

data ClaimDeviceResponse Source #

Response message containing device id of the claim.

See: claimDeviceResponse smart constructor.

Instances
Eq ClaimDeviceResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data ClaimDeviceResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: ClaimDeviceResponse -> Constr #

dataTypeOf :: ClaimDeviceResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ClaimDeviceResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic ClaimDeviceResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep ClaimDeviceResponse :: Type -> Type #

ToJSON ClaimDeviceResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON ClaimDeviceResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ClaimDeviceResponse Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep ClaimDeviceResponse = D1 (MetaData "ClaimDeviceResponse" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) (C1 (MetaCons "ClaimDeviceResponse'" PrefixI True) (S1 (MetaSel (Just "_cdrDeviceName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cdrDeviceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))

claimDeviceResponse :: ClaimDeviceResponse Source #

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

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

cdrDeviceName :: Lens' ClaimDeviceResponse (Maybe Text) Source #

The resource name of the device in the format `partners/[PARTNER_ID]/devices/[DEVICE_ID]`.

cdrDeviceId :: Lens' ClaimDeviceResponse (Maybe Int64) Source #

The device ID of the claimed device.

CreateCustomerRequest

data CreateCustomerRequest Source #

Request message to create a customer.

See: createCustomerRequest smart constructor.

Instances
Eq CreateCustomerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Data CreateCustomerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Methods

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

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

toConstr :: CreateCustomerRequest -> Constr #

dataTypeOf :: CreateCustomerRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CreateCustomerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Generic CreateCustomerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

Associated Types

type Rep CreateCustomerRequest :: Type -> Type #

ToJSON CreateCustomerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

FromJSON CreateCustomerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CreateCustomerRequest Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Product

type Rep CreateCustomerRequest = D1 (MetaData "CreateCustomerRequest" "Network.Google.AndroidDeviceProvisioning.Types.Product" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" True) (C1 (MetaCons "CreateCustomerRequest'" PrefixI True) (S1 (MetaSel (Just "_ccrCustomer") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Company))))

createCustomerRequest :: CreateCustomerRequest Source #

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

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

ccrCustomer :: Lens' CreateCustomerRequest (Maybe Company) Source #

Required. The company data to populate the new customer. Must contain a value for `companyName` and at least one `owner_email` that's associated with a Google Account. The values for `companyId` and `name` must be empty.

DevicesLongRunningOperationMetadataProcessingStatus

data DevicesLongRunningOperationMetadataProcessingStatus Source #

The processing status of the operation.

Constructors

BatchProcessStatusUnspecified

BATCH_PROCESS_STATUS_UNSPECIFIED Invalid code. Shouldn't be used.

BatchProcessPending

BATCH_PROCESS_PENDING Pending.

BatchProcessInProgress

BATCH_PROCESS_IN_PROGRESS In progress.

BatchProcessProcessed

BATCH_PROCESS_PROCESSED Processed. This doesn't mean all items were processed successfully, you should check the `response` field for the result of every item.

Instances
Enum DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Eq DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Data DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Methods

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

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

toConstr :: DevicesLongRunningOperationMetadataProcessingStatus -> Constr #

dataTypeOf :: DevicesLongRunningOperationMetadataProcessingStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Read DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Show DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Generic DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

Hashable DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToJSON DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromJSON DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

FromHttpApiData DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

ToHttpApiData DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep DevicesLongRunningOperationMetadataProcessingStatus Source # 
Instance details

Defined in Network.Google.AndroidDeviceProvisioning.Types.Sum

type Rep DevicesLongRunningOperationMetadataProcessingStatus = D1 (MetaData "DevicesLongRunningOperationMetadataProcessingStatus" "Network.Google.AndroidDeviceProvisioning.Types.Sum" "gogol-androiddeviceprovisioning-0.4.0-8GRqRwv1LfcIpEsrUb285r" False) ((C1 (MetaCons "BatchProcessStatusUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BatchProcessPending" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BatchProcessInProgress" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BatchProcessProcessed" PrefixI False) (U1 :: Type -> Type)))