gogol-accesscontextmanager-0.4.0: Google Access Context Manager 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.AccessContextManager.Types

Contents

Description

 
Synopsis

Service Configuration

accessContextManagerService :: ServiceConfig Source #

Default request referring to version v1beta of the Access Context Manager API. This contains the host and root path used as a starting point for constructing service requests.

OAuth Scopes

cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"] Source #

View and manage your data across Google Cloud Platform services

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.AccessContextManager.Types.Product

Methods

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

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

Data Status Source # 
Instance details

Defined in Network.Google.AccessContextManager.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.AccessContextManager.Types.Product

Generic Status Source # 
Instance details

Defined in Network.Google.AccessContextManager.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.AccessContextManager.Types.Product

FromJSON Status Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep Status = D1 (MetaData "Status" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" 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.

BasicLevel

data BasicLevel Source #

`BasicLevel` is an `AccessLevel` using a set of recommended features.

See: basicLevel smart constructor.

Instances
Eq BasicLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data BasicLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: BasicLevel -> Constr #

dataTypeOf :: BasicLevel -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BasicLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic BasicLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep BasicLevel :: Type -> Type #

ToJSON BasicLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON BasicLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep BasicLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep BasicLevel = D1 (MetaData "BasicLevel" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "BasicLevel'" PrefixI True) (S1 (MetaSel (Just "_blConditions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Condition])) :*: S1 (MetaSel (Just "_blCombiningFunction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicLevelCombiningFunction))))

basicLevel :: BasicLevel Source #

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

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

blConditions :: Lens' BasicLevel [Condition] Source #

Required. A list of requirements for the `AccessLevel` to be granted.

blCombiningFunction :: Lens' BasicLevel (Maybe BasicLevelCombiningFunction) Source #

How the `conditions` list should be combined to determine if a request is granted this `AccessLevel`. If AND is used, each `Condition` in `conditions` must be satisfied for the `AccessLevel` to be applied. If OR is used, at least one `Condition` in `conditions` must be satisfied for the `AccessLevel` to be applied. Default behavior is AND.

AccessLevel

data AccessLevel Source #

An `AccessLevel` is a label that can be applied to requests to GCP services, along with a list of requirements necessary for the label to be applied.

See: accessLevel smart constructor.

Instances
Eq AccessLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data AccessLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: AccessLevel -> Constr #

dataTypeOf :: AccessLevel -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccessLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic AccessLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep AccessLevel :: Type -> Type #

ToJSON AccessLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON AccessLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep AccessLevel Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep AccessLevel = D1 (MetaData "AccessLevel" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "AccessLevel'" PrefixI True) ((S1 (MetaSel (Just "_alBasic") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicLevel)) :*: (S1 (MetaSel (Just "_alUpdateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_alName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_alTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_alDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_alCreateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))))

accessLevel :: AccessLevel Source #

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

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

alBasic :: Lens' AccessLevel (Maybe BasicLevel) Source #

A `BasicLevel` composed of `Conditions`.

alUpdateTime :: Lens' AccessLevel (Maybe UTCTime) Source #

Output only. Time the `AccessLevel` was updated in UTC.

alName :: Lens' AccessLevel (Maybe Text) Source #

Required. Resource name for the Access Level. The `short_name` component must begin with a letter and only include alphanumeric and '_'. Format: `accessPolicies/{policy_id}/accessLevels/{short_name}`

alTitle :: Lens' AccessLevel (Maybe Text) Source #

Human readable title. Must be unique within the Policy.

alDescription :: Lens' AccessLevel (Maybe Text) Source #

Description of the `AccessLevel` and its use. Does not affect behavior.

alCreateTime :: Lens' AccessLevel (Maybe UTCTime) Source #

Output only. Time the `AccessLevel` was created in UTC.

BasicLevelCombiningFunction

data BasicLevelCombiningFunction Source #

How the `conditions` list should be combined to determine if a request is granted this `AccessLevel`. If AND is used, each `Condition` in `conditions` must be satisfied for the `AccessLevel` to be applied. If OR is used, at least one `Condition` in `conditions` must be satisfied for the `AccessLevel` to be applied. Default behavior is AND.

Constructors

And

AND All `Conditions` must be true for the `BasicLevel` to be true.

OR

OR If at least one `Condition` is true, then the `BasicLevel` is true.

Instances
Enum BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Eq BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Data BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Methods

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

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

toConstr :: BasicLevelCombiningFunction -> Constr #

dataTypeOf :: BasicLevelCombiningFunction -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Read BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Show BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Generic BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Associated Types

type Rep BasicLevelCombiningFunction :: Type -> Type #

Hashable BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

ToJSON BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

FromJSON BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

FromHttpApiData BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

ToHttpApiData BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

type Rep BasicLevelCombiningFunction Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

type Rep BasicLevelCombiningFunction = D1 (MetaData "BasicLevelCombiningFunction" "Network.Google.AccessContextManager.Types.Sum" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "And" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OR" PrefixI False) (U1 :: Type -> Type))

ServicePerimeterConfig

data ServicePerimeterConfig Source #

`ServicePerimeterConfig` specifies a set of GCP resources that describe specific Service Perimeter configuration.

See: servicePerimeterConfig smart constructor.

Instances
Eq ServicePerimeterConfig Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data ServicePerimeterConfig Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: ServicePerimeterConfig -> Constr #

dataTypeOf :: ServicePerimeterConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ServicePerimeterConfig Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic ServicePerimeterConfig Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep ServicePerimeterConfig :: Type -> Type #

ToJSON ServicePerimeterConfig Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON ServicePerimeterConfig Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ServicePerimeterConfig Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ServicePerimeterConfig = D1 (MetaData "ServicePerimeterConfig" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "ServicePerimeterConfig'" PrefixI True) ((S1 (MetaSel (Just "_spcUnrestrictedServices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_spcResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_spcRestrictedServices") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_spcAccessLevels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))

servicePerimeterConfig :: ServicePerimeterConfig Source #

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

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

spcUnrestrictedServices :: Lens' ServicePerimeterConfig [Text] Source #

GCP services that are not subject to the Service Perimeter restrictions. May contain a list of services or a single wildcard "*". For example, if `logging.googleapis.com` is unrestricted, users can access logs inside the perimeter as if the perimeter doesn't exist, and it also means VMs inside the perimeter can access logs outside the perimeter. The wildcard means that unless explicitly specified by "restricted_services" list, any service is treated as unrestricted. One of the fields "restricted_services", "unrestricted_services" must contain a wildcard "*", otherwise the Service Perimeter specification is invalid. It also means that both field being empty is invalid as well. "unrestricted_services" can be empty if and only if "restricted_services" list contains a "*" wildcard.

spcResources :: Lens' ServicePerimeterConfig [Text] Source #

A list of GCP resources that are inside of the service perimeter. Currently only projects are allowed. Format: `projects/{project_number}`

spcRestrictedServices :: Lens' ServicePerimeterConfig [Text] Source #

GCP services that are subject to the Service Perimeter restrictions. May contain a list of services or a single wildcard "*". For example, if `storage.googleapis.com` is specified, access to the storage buckets inside the perimeter must meet the perimeter's access restrictions. Wildcard means that unless explicitly specified by "unrestricted_services" list, any service is treated as restricted. One of the fields "restricted_services", "unrestricted_services" must contain a wildcard "*", otherwise the Service Perimeter specification is invalid. It also means that both field being empty is invalid as well. "restricted_services" can be empty if and only if "unrestricted_services" list contains a "*" wildcard.

spcAccessLevels :: Lens' ServicePerimeterConfig [Text] Source #

A list of `AccessLevel` resource names that allow resources within the `ServicePerimeter` to be accessed from the internet. `AccessLevels` listed must be in the same policy as this `ServicePerimeter`. Referencing a nonexistent `AccessLevel` is a syntax error. If no `AccessLevel` names are listed, resources within the perimeter can only be accessed via GCP calls with request origins within the perimeter. Example: `"accessPolicies/MY_POLICY/accessLevels/MY_LEVEL"`. For Service Perimeter Bridge, must be empty.

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.AccessContextManager.Types.Product

Data Operation Source # 
Instance details

Defined in Network.Google.AccessContextManager.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.AccessContextManager.Types.Product

Generic Operation Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep Operation = D1 (MetaData "Operation" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" 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 #

The error result of the operation in case of failure or cancellation.

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

The normal response of the operation in case of success. If the original method returns no data on success, such as `Delete`, the response is `google.protobuf.Empty`. If the original method is standard `Get`/`Create`/`Update`, the response should be the resource. For other methods, the response should have the type `XxxResponse`, where `Xxx` is the original method name. For example, if the original method name is `TakeSnapshot()`, the inferred response type is `TakeSnapshotResponse`.

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 #

Service-specific metadata associated with the operation. It typically contains progress information and common metadata such as create time. Some services might not provide such metadata. Any method that returns a long-running operation should document the metadata type, if any.

ServicePerimeterPerimeterType

data ServicePerimeterPerimeterType Source #

Perimeter type indicator. A single project is allowed to be a member of single regular perimeter, but multiple service perimeter bridges. A project cannot be a included in a perimeter bridge without being included in regular perimeter. For perimeter bridges, restricted/unrestricted service lists as well as access lists must be empty.

Constructors

PerimeterTypeRegular

PERIMETER_TYPE_REGULAR Regular Perimeter.

PerimeterTypeBridge

PERIMETER_TYPE_BRIDGE Perimeter Bridge.

Instances
Enum ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Eq ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Data ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Methods

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

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

toConstr :: ServicePerimeterPerimeterType -> Constr #

dataTypeOf :: ServicePerimeterPerimeterType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Read ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Show ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Generic ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Associated Types

type Rep ServicePerimeterPerimeterType :: Type -> Type #

Hashable ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

ToJSON ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

FromJSON ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

FromHttpApiData ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

ToHttpApiData ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

type Rep ServicePerimeterPerimeterType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

type Rep ServicePerimeterPerimeterType = D1 (MetaData "ServicePerimeterPerimeterType" "Network.Google.AccessContextManager.Types.Sum" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "PerimeterTypeRegular" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PerimeterTypeBridge" PrefixI False) (U1 :: Type -> Type))

OSConstraintOSType

data OSConstraintOSType Source #

Required. The allowed OS type.

Constructors

OSUnspecified

OS_UNSPECIFIED The operating system of the device is not specified or not known.

DesktopMAC

DESKTOP_MAC A desktop Mac operating system.

DesktopWindows

DESKTOP_WINDOWS A desktop Windows operating system.

DesktopLinux

DESKTOP_LINUX A desktop Linux operating system.

DesktopChromeOS

DESKTOP_CHROME_OS A desktop ChromeOS operating system.

Android

ANDROID An Android operating system.

Ios

IOS An iOS operating system.

Instances
Enum OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Eq OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Data OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Methods

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

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

toConstr :: OSConstraintOSType -> Constr #

dataTypeOf :: OSConstraintOSType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Read OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Show OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Generic OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Associated Types

type Rep OSConstraintOSType :: Type -> Type #

Hashable OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

ToJSON OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

FromJSON OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

FromHttpApiData OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

ToHttpApiData OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

type Rep OSConstraintOSType Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

type Rep OSConstraintOSType = D1 (MetaData "OSConstraintOSType" "Network.Google.AccessContextManager.Types.Sum" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) ((C1 (MetaCons "OSUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DesktopMAC" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DesktopWindows" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "DesktopLinux" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DesktopChromeOS" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Android" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ios" PrefixI False) (U1 :: Type -> Type))))

ServicePerimeter

data ServicePerimeter Source #

`ServicePerimeter` describes a set of GCP resources which can freely import and export data amongst themselves, but not export outside of the `ServicePerimeter`. If a request with a source within this `ServicePerimeter` has a target outside of the `ServicePerimeter`, the request will be blocked. Otherwise the request is allowed. There are two types of Service Perimeter - Regular and Bridge. Regular Service Perimeters cannot overlap, a single GCP project can only belong to a single regular Service Perimeter. Service Perimeter Bridges can contain only GCP projects as members, a single GCP project may belong to multiple Service Perimeter Bridges.

See: servicePerimeter smart constructor.

Instances
Eq ServicePerimeter Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data ServicePerimeter Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: ServicePerimeter -> Constr #

dataTypeOf :: ServicePerimeter -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ServicePerimeter Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic ServicePerimeter Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep ServicePerimeter :: Type -> Type #

ToJSON ServicePerimeter Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON ServicePerimeter Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ServicePerimeter Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

servicePerimeter :: ServicePerimeter Source #

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

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

spStatus :: Lens' ServicePerimeter (Maybe ServicePerimeterConfig) Source #

Current ServicePerimeter configuration. Specifies sets of resources, restricted/unrestricted services and access levels that determine perimeter content and boundaries.

spPerimeterType :: Lens' ServicePerimeter (Maybe ServicePerimeterPerimeterType) Source #

Perimeter type indicator. A single project is allowed to be a member of single regular perimeter, but multiple service perimeter bridges. A project cannot be a included in a perimeter bridge without being included in regular perimeter. For perimeter bridges, restricted/unrestricted service lists as well as access lists must be empty.

spUpdateTime :: Lens' ServicePerimeter (Maybe UTCTime) Source #

Output only. Time the `ServicePerimeter` was updated in UTC.

spName :: Lens' ServicePerimeter (Maybe Text) Source #

Required. Resource name for the ServicePerimeter. The `short_name` component must begin with a letter and only include alphanumeric and '_'. Format: `accessPolicies/{policy_id}/servicePerimeters/{short_name}`

spTitle :: Lens' ServicePerimeter (Maybe Text) Source #

Human readable title. Must be unique within the Policy.

spDescription :: Lens' ServicePerimeter (Maybe Text) Source #

Description of the `ServicePerimeter` and its use. Does not affect behavior.

spCreateTime :: Lens' ServicePerimeter (Maybe UTCTime) Source #

Output only. Time the `ServicePerimeter` was created in UTC.

ListAccessPoliciesResponse

data ListAccessPoliciesResponse Source #

A response to `ListAccessPoliciesRequest`.

See: listAccessPoliciesResponse smart constructor.

Instances
Eq ListAccessPoliciesResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data ListAccessPoliciesResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: ListAccessPoliciesResponse -> Constr #

dataTypeOf :: ListAccessPoliciesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListAccessPoliciesResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic ListAccessPoliciesResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep ListAccessPoliciesResponse :: Type -> Type #

ToJSON ListAccessPoliciesResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON ListAccessPoliciesResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ListAccessPoliciesResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ListAccessPoliciesResponse = D1 (MetaData "ListAccessPoliciesResponse" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "ListAccessPoliciesResponse'" PrefixI True) (S1 (MetaSel (Just "_laprNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_laprAccessPolicies") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccessPolicy]))))

listAccessPoliciesResponse :: ListAccessPoliciesResponse Source #

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

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

laprNextPageToken :: Lens' ListAccessPoliciesResponse (Maybe Text) Source #

The pagination token to retrieve the next page of results. If the value is empty, no further results remain.

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AccessContextManager.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.AccessContextManager.Types.Product

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" 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.

OSConstraint

data OSConstraint Source #

A restriction on the OS type and version of devices making requests.

See: osConstraint smart constructor.

Instances
Eq OSConstraint Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data OSConstraint Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: OSConstraint -> Constr #

dataTypeOf :: OSConstraint -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OSConstraint Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic OSConstraint Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep OSConstraint :: Type -> Type #

ToJSON OSConstraint Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON OSConstraint Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep OSConstraint Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep OSConstraint = D1 (MetaData "OSConstraint" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "OSConstraint'" PrefixI True) (S1 (MetaSel (Just "_ocOSType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OSConstraintOSType)) :*: S1 (MetaSel (Just "_ocMinimumVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

osConstraint :: OSConstraint Source #

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

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

ocOSType :: Lens' OSConstraint (Maybe OSConstraintOSType) Source #

Required. The allowed OS type.

ocMinimumVersion :: Lens' OSConstraint (Maybe Text) Source #

The minimum allowed OS version. If not set, any version of this OS satisfies the constraint. Format: `"major.minor.patch"`. Examples: `"10.5.301"`, `"9.2.1"`.

AccessPolicy

data AccessPolicy Source #

`AccessPolicy` is a container for `AccessLevels` (which define the necessary attributes to use GCP services) and `ServicePerimeters` (which define regions of services able to freely pass data within a perimeter). An access policy is globally visible within an organization, and the restrictions it specifies apply to all projects within an organization.

See: accessPolicy smart constructor.

Instances
Eq AccessPolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data AccessPolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: AccessPolicy -> Constr #

dataTypeOf :: AccessPolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AccessPolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic AccessPolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep AccessPolicy :: Type -> Type #

ToJSON AccessPolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON AccessPolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep AccessPolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep AccessPolicy = D1 (MetaData "AccessPolicy" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "AccessPolicy'" PrefixI True) ((S1 (MetaSel (Just "_apParent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_apUpdateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) :*: (S1 (MetaSel (Just "_apName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_apTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_apCreateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))))

accessPolicy :: AccessPolicy Source #

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

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

apParent :: Lens' AccessPolicy (Maybe Text) Source #

Required. The parent of this `AccessPolicy` in the Cloud Resource Hierarchy. Currently immutable once created. Format: `organizations/{organization_id}`

apUpdateTime :: Lens' AccessPolicy (Maybe UTCTime) Source #

Output only. Time the `AccessPolicy` was updated in UTC.

apName :: Lens' AccessPolicy (Maybe Text) Source #

Output only. Resource name of the `AccessPolicy`. Format: `accessPolicies/{policy_id}`

apTitle :: Lens' AccessPolicy (Maybe Text) Source #

Required. Human readable title. Does not affect behavior.

apCreateTime :: Lens' AccessPolicy (Maybe UTCTime) Source #

Output only. Time the `AccessPolicy` was created in UTC.

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.AccessContextManager.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.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.AccessContextManager.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.AccessContextManager.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.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.AccessContextManager.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.AccessContextManager.Types.Sum" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

ListServicePerimetersResponse

data ListServicePerimetersResponse Source #

A response to `ListServicePerimetersRequest`.

See: listServicePerimetersResponse smart constructor.

Instances
Eq ListServicePerimetersResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data ListServicePerimetersResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: ListServicePerimetersResponse -> Constr #

dataTypeOf :: ListServicePerimetersResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListServicePerimetersResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic ListServicePerimetersResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep ListServicePerimetersResponse :: Type -> Type #

ToJSON ListServicePerimetersResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON ListServicePerimetersResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ListServicePerimetersResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ListServicePerimetersResponse = D1 (MetaData "ListServicePerimetersResponse" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "ListServicePerimetersResponse'" PrefixI True) (S1 (MetaSel (Just "_lsprNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lsprServicePerimeters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ServicePerimeter]))))

listServicePerimetersResponse :: ListServicePerimetersResponse Source #

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

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

lsprNextPageToken :: Lens' ListServicePerimetersResponse (Maybe Text) Source #

The pagination token to retrieve the next page of results. If the value is empty, no further results remain.

ListAccessLevelsResponse

data ListAccessLevelsResponse Source #

A response to `ListAccessLevelsRequest`.

See: listAccessLevelsResponse smart constructor.

Instances
Eq ListAccessLevelsResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data ListAccessLevelsResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: ListAccessLevelsResponse -> Constr #

dataTypeOf :: ListAccessLevelsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListAccessLevelsResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic ListAccessLevelsResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep ListAccessLevelsResponse :: Type -> Type #

ToJSON ListAccessLevelsResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON ListAccessLevelsResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ListAccessLevelsResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep ListAccessLevelsResponse = D1 (MetaData "ListAccessLevelsResponse" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "ListAccessLevelsResponse'" PrefixI True) (S1 (MetaSel (Just "_lalrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lalrAccessLevels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AccessLevel]))))

listAccessLevelsResponse :: ListAccessLevelsResponse Source #

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

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

lalrNextPageToken :: Lens' ListAccessLevelsResponse (Maybe Text) Source #

The pagination token to retrieve the next page of results. If the value is empty, no further results remain.

lalrAccessLevels :: Lens' ListAccessLevelsResponse [AccessLevel] Source #

List of the Access Level instances.

OperationMetadata

data OperationMetadata Source #

Service-specific metadata associated with the operation. It typically contains progress information and common metadata such as create time. Some services might not provide such metadata. Any method that returns a long-running operation should document the metadata type, if any.

See: operationMetadata smart constructor.

Instances
Eq OperationMetadata Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data OperationMetadata Source # 
Instance details

Defined in Network.Google.AccessContextManager.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.AccessContextManager.Types.Product

Generic OperationMetadata Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep OperationMetadata :: Type -> Type #

ToJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep OperationMetadata Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep OperationMetadata = D1 (MetaData "OperationMetadata" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" 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.

DevicePolicy

data DevicePolicy Source #

`DevicePolicy` specifies device specific restrictions necessary to acquire a given access level. A `DevicePolicy` specifies requirements for requests from devices to be granted access levels, it does not do any enforcement on the device. `DevicePolicy` acts as an AND over all specified fields, and each repeated field is an OR over its elements. Any unset fields are ignored. For example, if the proto is { os_type : DESKTOP_WINDOWS, os_type : DESKTOP_LINUX, encryption_status: ENCRYPTED}, then the DevicePolicy will be true for requests originating from encrypted Linux desktops and encrypted Windows desktops.

See: devicePolicy smart constructor.

Instances
Eq DevicePolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data DevicePolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: DevicePolicy -> Constr #

dataTypeOf :: DevicePolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DevicePolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic DevicePolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep DevicePolicy :: Type -> Type #

ToJSON DevicePolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON DevicePolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep DevicePolicy Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep DevicePolicy = D1 (MetaData "DevicePolicy" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "DevicePolicy'" PrefixI True) ((S1 (MetaSel (Just "_dpOSConstraints") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OSConstraint])) :*: S1 (MetaSel (Just "_dpRequireScreenlock") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_dpAllowedEncryptionStatuses") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_dpAllowedDeviceManagementLevels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))

devicePolicy :: DevicePolicy Source #

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

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

dpOSConstraints :: Lens' DevicePolicy [OSConstraint] Source #

Allowed OS versions, an empty list allows all types and all versions.

dpRequireScreenlock :: Lens' DevicePolicy (Maybe Bool) Source #

Whether or not screenlock is required for the DevicePolicy to be true. Defaults to `false`.

dpAllowedEncryptionStatuses :: Lens' DevicePolicy [Text] Source #

Allowed encryptions statuses, an empty list allows all statuses.

dpAllowedDeviceManagementLevels :: Lens' DevicePolicy [Text] Source #

Allowed device management levels, an empty list allows all management levels.

Condition

data Condition Source #

A condition necessary for an `AccessLevel` to be granted. The Condition is an AND over its fields. So a Condition is true if: 1) the request IP is from one of the listed subnetworks AND 2) the originating device complies with the listed device policy AND 3) all listed access levels are granted AND 4) the request was sent at a time allowed by the DateTimeRestriction.

See: condition smart constructor.

Instances
Eq Condition Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data Condition Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Methods

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

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

toConstr :: Condition -> Constr #

dataTypeOf :: Condition -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Condition Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Generic Condition Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep Condition :: Type -> Type #

ToJSON Condition Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON Condition Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep Condition Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep Condition = D1 (MetaData "Condition" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" False) (C1 (MetaCons "Condition'" PrefixI True) ((S1 (MetaSel (Just "_cMembers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_cNegate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_cIPSubnetworks") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_cDevicePolicy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DevicePolicy)) :*: S1 (MetaSel (Just "_cRequiredAccessLevels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))))

condition :: Condition Source #

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

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

cMembers :: Lens' Condition [Text] Source #

The signed-in user originating the request must be a part of one of the provided members. Syntax: `user:{emailid}` `group:{emailid}` `serviceAccount:{emailid}` If not specified, a request may come from any user (logged in/not logged in, not present in any groups, etc.).

cNegate :: Lens' Condition (Maybe Bool) Source #

Whether to negate the Condition. If true, the Condition becomes a NAND over its non-empty fields, each field must be false for the Condition overall to be satisfied. Defaults to false.

cIPSubnetworks :: Lens' Condition [Text] Source #

CIDR block IP subnetwork specification. May be IPv4 or IPv6. Note that for a CIDR IP address block, the specified IP address portion must be properly truncated (i.e. all the host bits must be zero) or the input is considered malformed. For example, "192.0.2.0/24" is accepted but "192.0.2.1/24" is not. Similarly, for IPv6, "2001:db8::/32" is accepted whereas "2001:db8::1/32" is not. The originating IP of a request must be in one of the listed subnets in order for this Condition to be true. If empty, all IP addresses are allowed.

cDevicePolicy :: Lens' Condition (Maybe DevicePolicy) Source #

Device specific restrictions, all restrictions must hold for the Condition to be true. If not specified, all devices are allowed.

cRequiredAccessLevels :: Lens' Condition [Text] Source #

A list of other access levels defined in the same `Policy`, referenced by resource name. Referencing an `AccessLevel` which does not exist is an error. All access levels listed must be granted for the Condition to be true. Example: "`accessPolicies/MY_POLICY/accessLevels/LEVEL_NAME"`

OperationResponse

data OperationResponse Source #

The normal response of the operation in case of success. If the original method returns no data on success, such as `Delete`, the response is `google.protobuf.Empty`. If the original method is standard `Get`/`Create`/`Update`, the response should be the resource. For other methods, the response should have the type `XxxResponse`, where `Xxx` is the original method name. For example, if the original method name is `TakeSnapshot()`, the inferred response type is `TakeSnapshotResponse`.

See: operationResponse smart constructor.

Instances
Eq OperationResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Data OperationResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.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.AccessContextManager.Types.Product

Generic OperationResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

Associated Types

type Rep OperationResponse :: Type -> Type #

ToJSON OperationResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

FromJSON OperationResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep OperationResponse Source # 
Instance details

Defined in Network.Google.AccessContextManager.Types.Product

type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.AccessContextManager.Types.Product" "gogol-accesscontextmanager-0.4.0-34HzU3tNZ3QCokPfddM6sJ" 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.