gogol-datafusion-0.5.0: Google Cloud Data Fusion 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.DataFusion

Contents

Description

Cloud Data Fusion is a fully-managed, cloud native, enterprise data integration service for quickly building and managing data pipelines. It provides a graphical interface to increase time efficiency and reduce complexity, and allows business users, developers, and data scientists to easily and reliably build scalable data integration solutions to cleanse, prepare, blend, transfer and transform data without having to wrestle with infrastructure.

See: Cloud Data Fusion API Reference

Synopsis

Service Configuration

dataFusionService :: ServiceConfig Source #

Default request referring to version v1beta1 of the Cloud Data Fusion 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

API Declaration

Resources

datafusion.projects.locations.get

datafusion.projects.locations.instances.create

datafusion.projects.locations.instances.delete

datafusion.projects.locations.instances.get

datafusion.projects.locations.instances.getIamPolicy

datafusion.projects.locations.instances.list

datafusion.projects.locations.instances.patch

datafusion.projects.locations.instances.restart

datafusion.projects.locations.instances.setIamPolicy

datafusion.projects.locations.instances.testIamPermissions

datafusion.projects.locations.instances.upgrade

datafusion.projects.locations.list

datafusion.projects.locations.operations.cancel

datafusion.projects.locations.operations.delete

datafusion.projects.locations.operations.get

datafusion.projects.locations.operations.list

Types

InstanceLabels

data InstanceLabels Source #

The resource labels for instance to use to annotate any related underlying resources such as GCE VMs. The character '=' is not allowed to be used within the labels.

See: instanceLabels smart constructor.

Instances
Eq InstanceLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data InstanceLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: InstanceLabels -> Constr #

dataTypeOf :: InstanceLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show InstanceLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic InstanceLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep InstanceLabels :: Type -> Type #

ToJSON InstanceLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON InstanceLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep InstanceLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep InstanceLabels = D1 (MetaData "InstanceLabels" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "InstanceLabels'" PrefixI True) (S1 (MetaSel (Just "_ilAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

instanceLabels Source #

Creates a value of InstanceLabels 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.DataFusion.Types.Product

Methods

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

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

Data Status Source # 
Instance details

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

Generic Status Source # 
Instance details

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

FromJSON Status Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Status = D1 (MetaData "Status" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" 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.

OperationSchema

data OperationSchema 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: operationSchema smart constructor.

Instances
Eq OperationSchema Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data OperationSchema Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: OperationSchema -> Constr #

dataTypeOf :: OperationSchema -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationSchema Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic OperationSchema Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep OperationSchema :: Type -> Type #

ToJSON OperationSchema Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON OperationSchema Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep OperationSchema Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep OperationSchema = D1 (MetaData "OperationSchema" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "OperationSchema'" PrefixI True) (S1 (MetaSel (Just "_osAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationSchema Source #

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

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

osAddtional :: Lens' OperationSchema (HashMap Text JSONValue) Source #

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

CounterOptions

data CounterOptions Source #

Increment a streamz counter with the specified metric and field names. Metric names should start with a '/', generally be lowercase-only, and end in "_count". Field names should not contain an initial slash. The actual exported metric names will have "/iam/policy" prepended. Field names correspond to IAM request parameters and field values are their respective values. Supported field names: - "authority", which is "[token]" if IAMContext.token is present, otherwise the value of IAMContext.authority_selector if present, and otherwise a representation of IAMContext.principal; or - "iam_principal", a representation of IAMContext.principal even if a token or authority selector is present; or - "" (empty string), resulting in a counter with no fields. Examples: counter { metric: "/debug_access_count" field: "iam_principal" } ==> increment counter /iam/policy/backend_debug_access_count {iam_principal=[value of IAMContext.principal]} At this time we do not support multiple field names (though this may be supported in the future).

See: counterOptions smart constructor.

Instances
Eq CounterOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data CounterOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: CounterOptions -> Constr #

dataTypeOf :: CounterOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CounterOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic CounterOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep CounterOptions :: Type -> Type #

ToJSON CounterOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON CounterOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep CounterOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep CounterOptions = D1 (MetaData "CounterOptions" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "CounterOptions'" PrefixI True) (S1 (MetaSel (Just "_coField") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_coMetric") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

counterOptions :: CounterOptions Source #

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

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

coField :: Lens' CounterOptions (Maybe Text) Source #

The field value to attribute.

coMetric :: Lens' CounterOptions (Maybe Text) Source #

The metric to update.

AuditConfig

data AuditConfig Source #

Specifies the audit configuration for a service. The configuration determines which permission types are logged, and what identities, if any, are exempted from logging. An AuditConfig must have one or more AuditLogConfigs. If there are AuditConfigs for both `allServices` and a specific service, the union of the two AuditConfigs is used for that service: the log_types specified in each AuditConfig are enabled, and the exempted_members in each AuditLogConfig are exempted. Example Policy with multiple AuditConfigs: { "audit_configs": [ { "service": "allServices" "audit_log_configs": [ { "log_type": "DATA_READ", "exempted_members": [ "user:foo'gmail.com" ] }, { "log_type": "DATA_WRITE", }, { "log_type": "ADMIN_READ", } ] }, { "service": "fooservice.googleapis.com" "audit_log_configs": [ { "log_type": "DATA_READ", }, { "log_type": "DATA_WRITE", "exempted_members": [ "user:bar'gmail.com" ] } ] } ] } For fooservice, this policy enables DATA_READ, DATA_WRITE and ADMIN_READ logging. It also exempts foo'gmail.com from DATA_READ logging, and bar'gmail.com from DATA_WRITE logging.

See: auditConfig smart constructor.

Instances
Eq AuditConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data AuditConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: AuditConfig -> Constr #

dataTypeOf :: AuditConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AuditConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic AuditConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep AuditConfig :: Type -> Type #

ToJSON AuditConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON AuditConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep AuditConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep AuditConfig = D1 (MetaData "AuditConfig" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "AuditConfig'" PrefixI True) (S1 (MetaSel (Just "_acService") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_acAuditLogConfigs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AuditLogConfig])) :*: S1 (MetaSel (Just "_acExemptedMembers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))

auditConfig :: AuditConfig Source #

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

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

acService :: Lens' AuditConfig (Maybe Text) Source #

Specifies a service that will be enabled for audit logging. For example, `storage.googleapis.com`, `cloudsql.googleapis.com`. `allServices` is a special value that covers all services.

acAuditLogConfigs :: Lens' AuditConfig [AuditLogConfig] Source #

The configuration for logging of each type of permission.

CloudAuditOptionsLogName

data CloudAuditOptionsLogName Source #

The log_name to populate in the Cloud Audit Record.

Constructors

UnspecifiedLogName

UNSPECIFIED_LOG_NAME Default. Should not be used.

AdminActivity

ADMIN_ACTIVITY Corresponds to "cloudaudit.googleapis.com/activity"

DataAccess

DATA_ACCESS Corresponds to "cloudaudit.googleapis.com/data_access"

Instances
Enum CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: CloudAuditOptionsLogName -> Constr #

dataTypeOf :: CloudAuditOptionsLogName -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep CloudAuditOptionsLogName :: Type -> Type #

Hashable CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep CloudAuditOptionsLogName Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep CloudAuditOptionsLogName = D1 (MetaData "CloudAuditOptionsLogName" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "UnspecifiedLogName" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "AdminActivity" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DataAccess" PrefixI False) (U1 :: Type -> Type)))

Expr

data Expr Source #

Represents an expression text. Example: title: "User account presence" description: "Determines whether the request has a user account" expression: "size(request.user) > 0"

See: expr smart constructor.

Instances
Eq Expr Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

Data Expr Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: Expr -> Constr #

dataTypeOf :: Expr -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Expr Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Generic Expr Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep Expr :: Type -> Type #

Methods

from :: Expr -> Rep Expr x #

to :: Rep Expr x -> Expr #

ToJSON Expr Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON Expr Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Expr Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Expr = D1 (MetaData "Expr" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "Expr'" PrefixI True) ((S1 (MetaSel (Just "_eLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eExpression") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_eTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

expr :: Expr Source #

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

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

eLocation :: Lens' Expr (Maybe Text) Source #

An optional string indicating the location of the expression for error reporting, e.g. a file name and a position in the file.

eExpression :: Lens' Expr (Maybe Text) Source #

Textual representation of an expression in Common Expression Language syntax. The application context of the containing message determines which well-known feature set of CEL is supported.

eTitle :: Lens' Expr (Maybe Text) Source #

An optional title for the expression, i.e. a short string describing its purpose. This can be used e.g. in UIs which allow to enter the expression.

eDescription :: Lens' Expr (Maybe Text) Source #

An optional description of the expression. This is a longer text which describes the expression, e.g. when hovered over it in a UI.

ListLocationsResponse

data ListLocationsResponse Source #

The response message for Locations.ListLocations.

See: listLocationsResponse smart constructor.

Instances
Eq ListLocationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data ListLocationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: ListLocationsResponse -> Constr #

dataTypeOf :: ListLocationsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListLocationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic ListLocationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep ListLocationsResponse :: Type -> Type #

ToJSON ListLocationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON ListLocationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep ListLocationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep ListLocationsResponse = D1 (MetaData "ListLocationsResponse" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "ListLocationsResponse'" PrefixI True) (S1 (MetaSel (Just "_llrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_llrLocations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Location]))))

listLocationsResponse :: ListLocationsResponse Source #

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

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

llrNextPageToken :: Lens' ListLocationsResponse (Maybe Text) Source #

The standard List next-page token.

llrLocations :: Lens' ListLocationsResponse [Location] Source #

A list of locations that matches the specified filter in the request.

ListOperationsResponse

data ListOperationsResponse Source #

The response message for Operations.ListOperations.

See: listOperationsResponse smart constructor.

Instances
Eq ListOperationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data ListOperationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: ListOperationsResponse -> Constr #

dataTypeOf :: ListOperationsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListOperationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic ListOperationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep ListOperationsResponse :: Type -> Type #

ToJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep ListOperationsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep ListOperationsResponse = D1 (MetaData "ListOperationsResponse" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "ListOperationsResponse'" PrefixI True) (S1 (MetaSel (Just "_lorNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lorOperations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Operation]))))

listOperationsResponse :: ListOperationsResponse Source #

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

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

lorNextPageToken :: Lens' ListOperationsResponse (Maybe Text) Source #

The standard List next-page token.

lorOperations :: Lens' ListOperationsResponse [Operation] Source #

A list of operations that matches the specified filter in the request.

CancelOperationRequest

data CancelOperationRequest Source #

The request message for Operations.CancelOperation.

See: cancelOperationRequest smart constructor.

Instances
Eq CancelOperationRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data CancelOperationRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: CancelOperationRequest -> Constr #

dataTypeOf :: CancelOperationRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CancelOperationRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic CancelOperationRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep CancelOperationRequest :: Type -> Type #

ToJSON CancelOperationRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON CancelOperationRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep CancelOperationRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep CancelOperationRequest = D1 (MetaData "CancelOperationRequest" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "CancelOperationRequest'" PrefixI False) (U1 :: Type -> Type))

cancelOperationRequest :: CancelOperationRequest Source #

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

ConditionSys

data ConditionSys Source #

Trusted attributes supplied by any service that owns resources and uses the IAM system for access control.

Constructors

NoAttr

NO_ATTR Default non-attribute type

Region

REGION Region of the resource

Service

SERVICE Service name

Name

NAME Resource name

IP

IP IP address of the caller

Instances
Enum ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: ConditionSys -> Constr #

dataTypeOf :: ConditionSys -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep ConditionSys :: Type -> Type #

Hashable ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep ConditionSys Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep ConditionSys = D1 (MetaData "ConditionSys" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) ((C1 (MetaCons "NoAttr" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Region" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Service" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Name" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "IP" PrefixI False) (U1 :: Type -> Type))))

Location

data Location Source #

A resource that represents Google Cloud Platform location.

See: location smart constructor.

Instances
Eq Location Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data Location Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: Location -> Constr #

dataTypeOf :: Location -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Location Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic Location Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep Location :: Type -> Type #

Methods

from :: Location -> Rep Location x #

to :: Rep Location x -> Location #

ToJSON Location Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON Location Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Location Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Location = D1 (MetaData "Location" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "Location'" PrefixI True) ((S1 (MetaSel (Just "_lName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LocationMetadata))) :*: (S1 (MetaSel (Just "_lDisplayName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_lLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LocationLabels)) :*: S1 (MetaSel (Just "_lLocationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

location :: Location Source #

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

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

lName :: Lens' Location (Maybe Text) Source #

Resource name for the location, which may vary between implementations. For example: `"projects/example-project/locations/us-east1"`

lMetadata :: Lens' Location (Maybe LocationMetadata) Source #

Service-specific metadata. For example the available capacity at the given location.

lDisplayName :: Lens' Location (Maybe Text) Source #

The friendly name for this location, typically a nearby city name. For example, "Tokyo".

lLabels :: Lens' Location (Maybe LocationLabels) Source #

Cross-service attributes for the location. For example {"cloud.googleapis.com/region": "us-east1"}

lLocationId :: Lens' Location (Maybe Text) Source #

The canonical id for this location. For example: `"us-east1"`.

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

Data Operation Source # 
Instance details

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

Generic Operation Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

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 OperationSchema) 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.

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

Methods

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

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

Data Empty Source # 
Instance details

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

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

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

FromJSON Empty Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" 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.

RuleAction

data RuleAction Source #

Required

Constructors

NoAction

NO_ACTION Default no action.

Allow

ALLOW Matching 'Entries' grant access.

AllowWithLog

ALLOW_WITH_LOG Matching 'Entries' grant access and the caller promises to log the request per the returned log_configs.

Deny

DENY Matching 'Entries' deny access.

DenyWithLog

DENY_WITH_LOG Matching 'Entries' deny access and the caller promises to log the request per the returned log_configs.

Log

LOG Matching 'Entries' tell IAM.Check callers to generate logs.

Instances
Enum RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: RuleAction -> Constr #

dataTypeOf :: RuleAction -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep RuleAction :: Type -> Type #

Hashable RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep RuleAction Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep RuleAction = D1 (MetaData "RuleAction" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) ((C1 (MetaCons "NoAction" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Allow" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AllowWithLog" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "Deny" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DenyWithLog" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Log" PrefixI False) (U1 :: Type -> Type))))

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data StatusDetailsItem Source # 
Instance details

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

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" 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.

Rule

data Rule Source #

A rule to be applied in a Policy.

See: rule smart constructor.

Instances
Eq Rule Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

Data Rule Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: Rule -> Constr #

dataTypeOf :: Rule -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Rule Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

showsPrec :: Int -> Rule -> ShowS #

show :: Rule -> String #

showList :: [Rule] -> ShowS #

Generic Rule Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep Rule :: Type -> Type #

Methods

from :: Rule -> Rep Rule x #

to :: Rep Rule x -> Rule #

ToJSON Rule Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON Rule Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Rule Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

rule :: Rule Source #

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

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

rIn :: Lens' Rule [Text] Source #

If one or more 'in' clauses are specified, the rule matches if the PRINCIPAL/AUTHORITY_SELECTOR is in at least one of these entries.

rNotIn :: Lens' Rule [Text] Source #

If one or more 'not_in' clauses are specified, the rule matches if the PRINCIPAL/AUTHORITY_SELECTOR is in none of the entries. The format for in and not_in entries can be found at in the Local IAM documentation (see go/local-iam#features).

rConditions :: Lens' Rule [Condition] Source #

Additional restrictions that must be met. All conditions must pass for the rule to match.

rPermissions :: Lens' Rule [Text] Source #

A permission is a string of form '..' (e.g., 'storage.buckets.list'). A value of '*' matches all permissions, and a verb part of '*' (e.g., 'storage.buckets.*') matches all verbs.

rLogConfig :: Lens' Rule [LogConfig] Source #

The config returned to callers of tech.iam.IAM.CheckPolicy for any entries that match the LOG action.

rDescription :: Lens' Rule (Maybe Text) Source #

Human-readable description of the rule.

SetIAMPolicyRequest

data SetIAMPolicyRequest Source #

Request message for `SetIamPolicy` method.

See: setIAMPolicyRequest smart constructor.

Instances
Eq SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: SetIAMPolicyRequest -> Constr #

dataTypeOf :: SetIAMPolicyRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep SetIAMPolicyRequest :: Type -> Type #

ToJSON SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep SetIAMPolicyRequest = D1 (MetaData "SetIAMPolicyRequest" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "SetIAMPolicyRequest'" PrefixI True) (S1 (MetaSel (Just "_siprUpdateMask") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)) :*: S1 (MetaSel (Just "_siprPolicy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Policy))))

setIAMPolicyRequest :: SetIAMPolicyRequest Source #

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

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

siprUpdateMask :: Lens' SetIAMPolicyRequest (Maybe GFieldMask) Source #

OPTIONAL: A FieldMask specifying which fields of the policy to modify. Only the fields in the mask will be modified. If no mask is provided, the following default mask is used: paths: "bindings, etag" This field is only used by Cloud IAM.

siprPolicy :: Lens' SetIAMPolicyRequest (Maybe Policy) Source #

REQUIRED: The complete policy to be applied to the `resource`. The size of the policy is limited to a few 10s of KB. An empty policy is a valid policy but certain Cloud Platform services (such as Projects) might reject them.

InstanceType

data InstanceType Source #

Required. Instance type.

Constructors

TypeUnspecified

TYPE_UNSPECIFIED No type specified. The instance creation will fail.

Basic

BASIC Basic Data Fusion instance. In Basic type, the user will be able to create data pipelines using point and click UI. However, there are certain limitations, such as fewer number of concurrent pipelines, no support for streaming pipelines, etc.

Enterprise

ENTERPRISE Enterprise Data Fusion instance. In Enterprise type, the user will have more features available, such as support for streaming pipelines, higher number of concurrent pipelines, etc.

Instances
Enum InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: InstanceType -> Constr #

dataTypeOf :: InstanceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep InstanceType :: Type -> Type #

Hashable InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep InstanceType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep InstanceType = D1 (MetaData "InstanceType" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "TypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Basic" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Enterprise" PrefixI False) (U1 :: Type -> Type)))

NetworkConfig

data NetworkConfig Source #

Network configuration for a Data Fusion instance. These configurations are used for peering with the customer network. Configurations are optional when a public Data Fusion instance is to be created. However, providing these configurations allows several benefits, such as reduced network latency while accessing the customer resources from managed Data Fusion instance nodes, as well as access to the customer on-prem resources.

See: networkConfig smart constructor.

Instances
Eq NetworkConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data NetworkConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: NetworkConfig -> Constr #

dataTypeOf :: NetworkConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show NetworkConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic NetworkConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep NetworkConfig :: Type -> Type #

ToJSON NetworkConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON NetworkConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep NetworkConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep NetworkConfig = D1 (MetaData "NetworkConfig" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "NetworkConfig'" PrefixI True) (S1 (MetaSel (Just "_ncNetwork") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ncIPAllocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

networkConfig :: NetworkConfig Source #

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

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

ncNetwork :: Lens' NetworkConfig (Maybe Text) Source #

Name of the network in the customer project with which the Tenant Project will be peered for executing pipelines.

ncIPAllocation :: Lens' NetworkConfig (Maybe Text) Source #

The IP range in CIDR notation to use for the managed Data Fusion instance nodes. This range must not overlap with any other ranges used in the Data Fusion instance network.

CloudAuditOptions

data CloudAuditOptions Source #

Write a Cloud Audit log

See: cloudAuditOptions smart constructor.

Instances
Eq CloudAuditOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data CloudAuditOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: CloudAuditOptions -> Constr #

dataTypeOf :: CloudAuditOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CloudAuditOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic CloudAuditOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep CloudAuditOptions :: Type -> Type #

ToJSON CloudAuditOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON CloudAuditOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep CloudAuditOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep CloudAuditOptions = D1 (MetaData "CloudAuditOptions" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "CloudAuditOptions'" PrefixI True) (S1 (MetaSel (Just "_caoAuthorizationLoggingOptions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AuthorizationLoggingOptions)) :*: S1 (MetaSel (Just "_caoLogName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CloudAuditOptionsLogName))))

cloudAuditOptions :: CloudAuditOptions Source #

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

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

caoAuthorizationLoggingOptions :: Lens' CloudAuditOptions (Maybe AuthorizationLoggingOptions) Source #

Information used by the Cloud Audit Logging pipeline.

caoLogName :: Lens' CloudAuditOptions (Maybe CloudAuditOptionsLogName) Source #

The log_name to populate in the Cloud Audit Record.

ConditionOp

data ConditionOp Source #

An operator to apply the subject with.

Constructors

NoOp

NO_OP Default no-op.

Equals

EQUALS DEPRECATED. Use IN instead.

NotEquals

NOT_EQUALS DEPRECATED. Use NOT_IN instead.

IN

IN The condition is true if the subject (or any element of it if it is a set) matches any of the supplied values.

NotIn

NOT_IN The condition is true if the subject (or every element of it if it is a set) matches none of the supplied values.

Discharged

DISCHARGED Subject is discharged

Instances
Enum ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: ConditionOp -> Constr #

dataTypeOf :: ConditionOp -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep ConditionOp :: Type -> Type #

Hashable ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep ConditionOp Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep ConditionOp = D1 (MetaData "ConditionOp" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) ((C1 (MetaCons "NoOp" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Equals" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotEquals" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "IN" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NotIn" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Discharged" PrefixI False) (U1 :: Type -> Type))))

DataAccessOptions

data DataAccessOptions Source #

Write a Data Access (Gin) log

See: dataAccessOptions smart constructor.

Instances
Eq DataAccessOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data DataAccessOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: DataAccessOptions -> Constr #

dataTypeOf :: DataAccessOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DataAccessOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic DataAccessOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep DataAccessOptions :: Type -> Type #

ToJSON DataAccessOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON DataAccessOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep DataAccessOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep DataAccessOptions = D1 (MetaData "DataAccessOptions" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "DataAccessOptions'" PrefixI True) (S1 (MetaSel (Just "_daoLogMode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DataAccessOptionsLogMode))))

dataAccessOptions :: DataAccessOptions Source #

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

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

daoLogMode :: Lens' DataAccessOptions (Maybe DataAccessOptionsLogMode) Source #

Whether Gin logging should happen in a fail-closed manner at the caller. This is relevant only in the LocalIAM implementation, for now.

RestartInstanceRequest

data RestartInstanceRequest Source #

Request message for restarting a Data Fusion instance.

See: restartInstanceRequest smart constructor.

Instances
Eq RestartInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data RestartInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: RestartInstanceRequest -> Constr #

dataTypeOf :: RestartInstanceRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RestartInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic RestartInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep RestartInstanceRequest :: Type -> Type #

ToJSON RestartInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON RestartInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep RestartInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep RestartInstanceRequest = D1 (MetaData "RestartInstanceRequest" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "RestartInstanceRequest'" PrefixI False) (U1 :: Type -> Type))

restartInstanceRequest :: RestartInstanceRequest Source #

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

AuditLogConfigLogType

data AuditLogConfigLogType Source #

The log type that this config enables.

Constructors

LogTypeUnspecified

LOG_TYPE_UNSPECIFIED Default case. Should never be this.

AdminRead

ADMIN_READ Admin reads. Example: CloudIAM getIamPolicy

DataWrite

DATA_WRITE Data writes. Example: CloudSQL Users create

DataRead

DATA_READ Data reads. Example: CloudSQL Users list

Instances
Enum AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: AuditLogConfigLogType -> Constr #

dataTypeOf :: AuditLogConfigLogType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep AuditLogConfigLogType :: Type -> Type #

Hashable AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep AuditLogConfigLogType = D1 (MetaData "AuditLogConfigLogType" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) ((C1 (MetaCons "LogTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AdminRead" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "DataWrite" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DataRead" PrefixI False) (U1 :: Type -> Type)))

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

Eq Xgafv Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

TestIAMPermissionsRequest

data TestIAMPermissionsRequest Source #

Request message for `TestIamPermissions` method.

See: testIAMPermissionsRequest smart constructor.

Instances
Eq TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: TestIAMPermissionsRequest -> Constr #

dataTypeOf :: TestIAMPermissionsRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep TestIAMPermissionsRequest :: Type -> Type #

ToJSON TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep TestIAMPermissionsRequest = D1 (MetaData "TestIAMPermissionsRequest" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "TestIAMPermissionsRequest'" PrefixI True) (S1 (MetaSel (Just "_tiprPermissions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

testIAMPermissionsRequest :: TestIAMPermissionsRequest Source #

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

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

tiprPermissions :: Lens' TestIAMPermissionsRequest [Text] Source #

The set of permissions to check for the `resource`. Permissions with wildcards (such as '*' or 'storage.*') are not allowed. For more information see IAM Overview.

TestIAMPermissionsResponse

data TestIAMPermissionsResponse Source #

Response message for `TestIamPermissions` method.

See: testIAMPermissionsResponse smart constructor.

Instances
Eq TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: TestIAMPermissionsResponse -> Constr #

dataTypeOf :: TestIAMPermissionsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep TestIAMPermissionsResponse :: Type -> Type #

ToJSON TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep TestIAMPermissionsResponse = D1 (MetaData "TestIAMPermissionsResponse" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "TestIAMPermissionsResponse'" PrefixI True) (S1 (MetaSel (Just "_tiamprPermissions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

testIAMPermissionsResponse :: TestIAMPermissionsResponse Source #

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

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

tiamprPermissions :: Lens' TestIAMPermissionsResponse [Text] Source #

A subset of `TestPermissionsRequest.permissions` that the caller is allowed.

UpgradeInstanceRequest

data UpgradeInstanceRequest Source #

Request message for upgrading a Data Fusion instance. To change the instance properties, instance update should be used.

See: upgradeInstanceRequest smart constructor.

Instances
Eq UpgradeInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data UpgradeInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: UpgradeInstanceRequest -> Constr #

dataTypeOf :: UpgradeInstanceRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpgradeInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic UpgradeInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep UpgradeInstanceRequest :: Type -> Type #

ToJSON UpgradeInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON UpgradeInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep UpgradeInstanceRequest Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep UpgradeInstanceRequest = D1 (MetaData "UpgradeInstanceRequest" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "UpgradeInstanceRequest'" PrefixI False) (U1 :: Type -> Type))

upgradeInstanceRequest :: UpgradeInstanceRequest Source #

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

AuthorizationLoggingOptions

data AuthorizationLoggingOptions Source #

Authorization-related information used by Cloud Audit Logging.

See: authorizationLoggingOptions smart constructor.

Instances
Eq AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: AuthorizationLoggingOptions -> Constr #

dataTypeOf :: AuthorizationLoggingOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep AuthorizationLoggingOptions :: Type -> Type #

ToJSON AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep AuthorizationLoggingOptions = D1 (MetaData "AuthorizationLoggingOptions" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "AuthorizationLoggingOptions'" PrefixI True) (S1 (MetaSel (Just "_aloPermissionType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe AuthorizationLoggingOptionsPermissionType))))

authorizationLoggingOptions :: AuthorizationLoggingOptions Source #

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

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

Policy

data Policy Source #

Defines an Identity and Access Management (IAM) policy. It is used to specify access control policies for Cloud Platform resources. A `Policy` consists of a list of `bindings`. A `binding` binds a list of `members` to a `role`, where the members can be user accounts, Google groups, Google domains, and service accounts. A `role` is a named list of permissions defined by IAM. **JSON Example** { "bindings": [ { "role": "roles/owner", "members": [ "user:mike'example.com", "group:admins'example.com", "domain:google.com", "serviceAccount:my-other-app'appspot.gserviceaccount.com" ] }, { "role": "roles/viewer", "members": ["user:sean'example.com"] } ] } **YAML Example** bindings: - members: - user:mike'example.com - group:admins'example.com - domain:google.com - serviceAccount:my-other-app'appspot.gserviceaccount.com role: roles/owner - members: - user:sean'example.com role: roles/viewer For a description of IAM and its features, see the IAM developer's guide.

See: policy smart constructor.

Instances
Eq Policy Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

Data Policy Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: Policy -> Constr #

dataTypeOf :: Policy -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Policy Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic Policy Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep Policy :: Type -> Type #

Methods

from :: Policy -> Rep Policy x #

to :: Rep Policy x -> Policy #

ToJSON Policy Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON Policy Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Policy Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

policy :: Policy Source #

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

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

pAuditConfigs :: Lens' Policy [AuditConfig] Source #

Specifies cloud audit logging configuration for this policy.

pEtag :: Lens' Policy (Maybe ByteString) Source #

`etag` is used for optimistic concurrency control as a way to help prevent simultaneous updates of a policy from overwriting each other. It is strongly suggested that systems make use of the `etag` in the read-modify-write cycle to perform policy updates in order to avoid race conditions: An `etag` is returned in the response to `getIamPolicy`, and systems are expected to put that etag in the request to `setIamPolicy` to ensure that their change will be applied to the same version of the policy. If no `etag` is provided in the call to `setIamPolicy`, then the existing policy is overwritten blindly.

pRules :: Lens' Policy [Rule] Source #

If more than one rule is specified, the rules are applied in the following manner: - All matching LOG rules are always applied. - If any DENY/DENY_WITH_LOG rule matches, permission is denied. Logging will be applied if one or more matching rule requires logging. - Otherwise, if any ALLOW/ALLOW_WITH_LOG rule matches, permission is granted. Logging will be applied if one or more matching rule requires logging. - Otherwise, if no rule applies, permission is denied.

pBindings :: Lens' Policy [Binding] Source #

Associates a list of `members` to a `role`. `bindings` with no members will result in an error.

LocationLabels

data LocationLabels Source #

Cross-service attributes for the location. For example {"cloud.googleapis.com/region": "us-east1"}

See: locationLabels smart constructor.

Instances
Eq LocationLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data LocationLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: LocationLabels -> Constr #

dataTypeOf :: LocationLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LocationLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic LocationLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep LocationLabels :: Type -> Type #

ToJSON LocationLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON LocationLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep LocationLabels Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep LocationLabels = D1 (MetaData "LocationLabels" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "LocationLabels'" PrefixI True) (S1 (MetaSel (Just "_llAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

locationLabels Source #

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

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

LocationMetadata

data LocationMetadata Source #

Service-specific metadata. For example the available capacity at the given location.

See: locationMetadata smart constructor.

Instances
Eq LocationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data LocationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: LocationMetadata -> Constr #

dataTypeOf :: LocationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LocationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic LocationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep LocationMetadata :: Type -> Type #

ToJSON LocationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON LocationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep LocationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep LocationMetadata = D1 (MetaData "LocationMetadata" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "LocationMetadata'" PrefixI True) (S1 (MetaSel (Just "_lmAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

locationMetadata Source #

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

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

lmAddtional :: Lens' LocationMetadata (HashMap Text JSONValue) Source #

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

OperationMetadata

data OperationMetadata Source #

Represents the metadata of a long-running operation.

See: operationMetadata smart constructor.

Instances
Eq OperationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data OperationMetadata Source # 
Instance details

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

Generic OperationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep OperationMetadata :: Type -> Type #

ToJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep OperationMetadata Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep OperationMetadata = D1 (MetaData "OperationMetadata" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "OperationMetadata'" PrefixI True) ((S1 (MetaSel (Just "_omAPIVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_omRequestedCancellation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_omEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')))) :*: ((S1 (MetaSel (Just "_omStatusDetail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_omVerb") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_omTarget") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_omCreateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))))

operationMetadata :: 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:

omAPIVersion :: Lens' OperationMetadata (Maybe Text) Source #

API version used to start the operation.

omRequestedCancellation :: Lens' OperationMetadata (Maybe Bool) Source #

Identifies whether the user has requested cancellation of the operation. Operations that have successfully been cancelled have Operation.error value with a google.rpc.Status.code of 1, corresponding to `Code.CANCELLED`.

omEndTime :: Lens' OperationMetadata (Maybe UTCTime) Source #

The time the operation finished running.

omStatusDetail :: Lens' OperationMetadata (Maybe Text) Source #

Human-readable status of the operation if any.

omVerb :: Lens' OperationMetadata (Maybe Text) Source #

Name of the verb executed by the operation.

omTarget :: Lens' OperationMetadata (Maybe Text) Source #

Server-defined resource path for the target of the operation.

omCreateTime :: Lens' OperationMetadata (Maybe UTCTime) Source #

The time the operation was created.

DataAccessOptionsLogMode

data DataAccessOptionsLogMode Source #

Whether Gin logging should happen in a fail-closed manner at the caller. This is relevant only in the LocalIAM implementation, for now.

Constructors

LogModeUnspecified

LOG_MODE_UNSPECIFIED Client is not required to write a partial Gin log immediately after the authorization check. If client chooses to write one and it fails, client may either fail open (allow the operation to continue) or fail closed (handle as a DENY outcome).

LogFailClosed

LOG_FAIL_CLOSED The application's operation in the context of which this authorization check is being made may only be performed if it is successfully logged to Gin. For instance, the authorization library may satisfy this obligation by emitting a partial log entry at authorization check time and only returning ALLOW to the application if it succeeds. If a matching Rule has this directive, but the client has not indicated that it will honor such requirements, then the IAM check will result in authorization failure by setting CheckPolicyResponse.success=false.

Instances
Enum DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: DataAccessOptionsLogMode -> Constr #

dataTypeOf :: DataAccessOptionsLogMode -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep DataAccessOptionsLogMode :: Type -> Type #

Hashable DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep DataAccessOptionsLogMode Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep DataAccessOptionsLogMode = D1 (MetaData "DataAccessOptionsLogMode" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "LogModeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LogFailClosed" PrefixI False) (U1 :: Type -> Type))

AuditLogConfig

data AuditLogConfig Source #

Provides the configuration for logging a type of permissions. Example: { "audit_log_configs": [ { "log_type": "DATA_READ", "exempted_members": [ "user:foo'gmail.com" ] }, { "log_type": "DATA_WRITE", } ] } This enables 'DATA_READ' and 'DATA_WRITE' logging, while exempting foo'gmail.com from DATA_READ logging.

See: auditLogConfig smart constructor.

Instances
Eq AuditLogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data AuditLogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: AuditLogConfig -> Constr #

dataTypeOf :: AuditLogConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AuditLogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic AuditLogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep AuditLogConfig :: Type -> Type #

ToJSON AuditLogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON AuditLogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep AuditLogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep AuditLogConfig = D1 (MetaData "AuditLogConfig" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "AuditLogConfig'" PrefixI True) (S1 (MetaSel (Just "_alcLogType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AuditLogConfigLogType)) :*: S1 (MetaSel (Just "_alcExemptedMembers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))

auditLogConfig :: AuditLogConfig Source #

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

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

alcLogType :: Lens' AuditLogConfig (Maybe AuditLogConfigLogType) Source #

The log type that this config enables.

alcExemptedMembers :: Lens' AuditLogConfig [Text] Source #

Specifies the identities that do not cause logging for this type of permission. Follows the same format of Binding.members.

ListInstancesResponse

data ListInstancesResponse Source #

Response message for the list instance request.

See: listInstancesResponse smart constructor.

Instances
Eq ListInstancesResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data ListInstancesResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: ListInstancesResponse -> Constr #

dataTypeOf :: ListInstancesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListInstancesResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic ListInstancesResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep ListInstancesResponse :: Type -> Type #

ToJSON ListInstancesResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON ListInstancesResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep ListInstancesResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep ListInstancesResponse = D1 (MetaData "ListInstancesResponse" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "ListInstancesResponse'" PrefixI True) (S1 (MetaSel (Just "_lirNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_lirUnreachable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_lirInstances") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Instance])))))

listInstancesResponse :: ListInstancesResponse Source #

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

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

lirNextPageToken :: Lens' ListInstancesResponse (Maybe Text) Source #

Token to retrieve the next page of results or empty if there are no more results in the list.

lirUnreachable :: Lens' ListInstancesResponse [Text] Source #

Locations that could not be reached.

lirInstances :: Lens' ListInstancesResponse [Instance] Source #

Represents a list of Data Fusion instances.

AuthorizationLoggingOptionsPermissionType

data AuthorizationLoggingOptionsPermissionType Source #

The type of the permission that was checked.

Constructors

ALOPTPermissionTypeUnspecified

PERMISSION_TYPE_UNSPECIFIED Default. Should not be used.

ALOPTAdminRead

ADMIN_READ A read of admin (meta) data.

ALOPTAdminWrite

ADMIN_WRITE A write of admin (meta) data.

ALOPTDataRead

DATA_READ A read of standard data.

ALOPTDataWrite

DATA_WRITE A write of standard data.

Instances
Enum AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: AuthorizationLoggingOptionsPermissionType -> Constr #

dataTypeOf :: AuthorizationLoggingOptionsPermissionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Hashable AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep AuthorizationLoggingOptionsPermissionType Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep AuthorizationLoggingOptionsPermissionType = D1 (MetaData "AuthorizationLoggingOptionsPermissionType" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) ((C1 (MetaCons "ALOPTPermissionTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ALOPTAdminRead" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ALOPTAdminWrite" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ALOPTDataRead" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ALOPTDataWrite" PrefixI False) (U1 :: Type -> Type))))

Condition

data Condition Source #

A condition to be met.

See: condition smart constructor.

Instances
Eq Condition Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data Condition Source # 
Instance details

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

Generic Condition Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep Condition :: Type -> Type #

ToJSON Condition Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON Condition Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Condition Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

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:

cOp :: Lens' Condition (Maybe ConditionOp) Source #

An operator to apply the subject with.

cIAM :: Lens' Condition (Maybe ConditionIAM) Source #

Trusted attributes supplied by the IAM system.

cValues :: Lens' Condition [Text] Source #

The objects of the condition.

cSys :: Lens' Condition (Maybe ConditionSys) Source #

Trusted attributes supplied by any service that owns resources and uses the IAM system for access control.

cSvc :: Lens' Condition (Maybe Text) Source #

Trusted attributes discharged by the service.

InstanceState

data InstanceState Source #

Output only. The current state of this Data Fusion instance.

Constructors

StateUnspecified

STATE_UNSPECIFIED Instance does not have a state yet

Creating

CREATING Instance is being created

Running

RUNNING Instance is running and ready for requests

Failed

FAILED Instance creation failed

Deleting

DELETING Instance is being deleted

Upgrading

UPGRADING Instance is being upgraded

Restarting

RESTARTING Instance is being restarted

Updating

UPDATING Instance is being updated

Instances
Enum InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: InstanceState -> Constr #

dataTypeOf :: InstanceState -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep InstanceState :: Type -> Type #

Hashable InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep InstanceState Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep InstanceState = D1 (MetaData "InstanceState" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (((C1 (MetaCons "StateUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Creating" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Running" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Failed" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Deleting" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Upgrading" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Restarting" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Updating" PrefixI False) (U1 :: Type -> Type))))

ConditionIAM

data ConditionIAM Source #

Trusted attributes supplied by the IAM system.

Constructors

CINoAttr

NO_ATTR Default non-attribute.

CIAuthority

AUTHORITY Either principal or (if present) authority selector.

CIAttribution

ATTRIBUTION The principal (even if an authority selector is present), which must only be used for attribution, not authorization.

CISecurityRealm

SECURITY_REALM Any of the security realms in the IAMContext (go/security-realms). When used with IN, the condition indicates "any of the request's realms match one of the given values; with NOT_IN, "none of the realms match any of the given values". Note that a value can be: - 'self' (i.e., allow connections from clients that are in the same security realm) - a realm (e.g., 'campus-abc') - a realm group (e.g., 'realms-for-borg-cell-xx', see: go/realm-groups) A match is determined by a realm group membership check performed by a RealmAclRep object (go/realm-acl-howto). It is not permitted to grant access based on the *absence* of a realm, so realm conditions can only be used in a "positive" context (e.g., ALLOW/IN or DENY/NOT_IN).

CIApprover

APPROVER An approver (distinct from the requester) that has authorized this request. When used with IN, the condition indicates that one of the approvers associated with the request matches the specified principal, or is a member of the specified group. Approvers can only grant additional access, and are thus only used in a strictly positive context (e.g. ALLOW/IN or DENY/NOT_IN).

CIJustificationType

JUSTIFICATION_TYPE What types of justifications have been supplied with this request. String values should match enum names from tech.iam.JustificationType, e.g. "MANUAL_STRING". It is not permitted to grant access based on the *absence* of a justification, so justification conditions can only be used in a "positive" context (e.g., ALLOW/IN or DENY/NOT_IN). Multiple justifications, e.g., a Buganizer ID and a manually-entered reason, are normal and supported.

CICredentialsType

CREDENTIALS_TYPE What type of credentials have been supplied with this request. String values should match enum names from security_loas_l2.CredentialsType - currently, only CREDS_TYPE_EMERGENCY is supported. It is not permitted to grant access based on the *absence* of a credentials type, so the conditions can only be used in a "positive" context (e.g., ALLOW/IN or DENY/NOT_IN).

Instances
Enum ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Eq ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Data ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Methods

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

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

toConstr :: ConditionIAM -> Constr #

dataTypeOf :: ConditionIAM -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Read ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Show ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Generic ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

Associated Types

type Rep ConditionIAM :: Type -> Type #

Hashable ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToJSON ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromJSON ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

FromHttpApiData ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

ToHttpApiData ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep ConditionIAM Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Sum

type Rep ConditionIAM = D1 (MetaData "ConditionIAM" "Network.Google.DataFusion.Types.Sum" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) ((C1 (MetaCons "CINoAttr" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CIAuthority" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CIAttribution" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "CISecurityRealm" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CIApprover" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "CIJustificationType" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CICredentialsType" PrefixI False) (U1 :: Type -> Type))))

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

Data OperationResponse Source # 
Instance details

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

Generic OperationResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep OperationResponse :: Type -> Type #

ToJSON OperationResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON OperationResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep OperationResponse Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" 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.

LogConfig

data LogConfig Source #

Specifies what kind of log the caller must write

See: logConfig smart constructor.

Instances
Eq LogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data LogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: LogConfig -> Constr #

dataTypeOf :: LogConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic LogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep LogConfig :: Type -> Type #

ToJSON LogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON LogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep LogConfig Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep LogConfig = D1 (MetaData "LogConfig" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "LogConfig'" PrefixI True) (S1 (MetaSel (Just "_lcCloudAudit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CloudAuditOptions)) :*: (S1 (MetaSel (Just "_lcDataAccess") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DataAccessOptions)) :*: S1 (MetaSel (Just "_lcCounter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CounterOptions)))))

logConfig :: LogConfig Source #

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

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

InstanceOptions

data InstanceOptions Source #

Map of additional options used to configure the behavior of Data Fusion instance.

See: instanceOptions smart constructor.

Instances
Eq InstanceOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data InstanceOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: InstanceOptions -> Constr #

dataTypeOf :: InstanceOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show InstanceOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic InstanceOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep InstanceOptions :: Type -> Type #

ToJSON InstanceOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON InstanceOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep InstanceOptions Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep InstanceOptions = D1 (MetaData "InstanceOptions" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" True) (C1 (MetaCons "InstanceOptions'" PrefixI True) (S1 (MetaSel (Just "_ioAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

instanceOptions Source #

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

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

Binding

data Binding Source #

Associates `members` with a `role`.

See: binding smart constructor.

Instances
Eq Binding Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

Data Binding Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: Binding -> Constr #

dataTypeOf :: Binding -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Binding Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic Binding Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep Binding :: Type -> Type #

Methods

from :: Binding -> Rep Binding x #

to :: Rep Binding x -> Binding #

ToJSON Binding Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON Binding Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Binding Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Binding = D1 (MetaData "Binding" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "Binding'" PrefixI True) (S1 (MetaSel (Just "_bMembers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_bRole") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bCondition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Expr)))))

binding :: Binding Source #

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

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

bMembers :: Lens' Binding [Text] Source #

Specifies the identities requesting access for a Cloud Platform resource. `members` can have the following values: * `allUsers`: A special identifier that represents anyone who is on the internet; with or without a Google account. * `allAuthenticatedUsers`: A special identifier that represents anyone who is authenticated with a Google account or a service account. * `user:{emailid}`: An email address that represents a specific Google account. For example, `alice'gmail.com` . * `serviceAccount:{emailid}`: An email address that represents a service account. For example, `my-other-app'appspot.gserviceaccount.com`. * `group:{emailid}`: An email address that represents a Google group. For example, `admins'example.com`. * `domain:{domain}`: The G Suite domain (primary) that represents all the users of that domain. For example, `google.com` or `example.com`.

bRole :: Lens' Binding (Maybe Text) Source #

Role that is assigned to `members`. For example, `roles/viewer`, `roles/editor`, or `roles/owner`.

bCondition :: Lens' Binding (Maybe Expr) Source #

The condition that is associated with this binding. NOTE: An unsatisfied condition will not allow user access via current binding. Different bindings, including their conditions, are examined independently.

Instance

data Instance Source #

Represents a Data Fusion instance.

See: instance' smart constructor.

Instances
Eq Instance Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Data Instance Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Methods

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

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

toConstr :: Instance -> Constr #

dataTypeOf :: Instance -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Instance Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Generic Instance Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

Associated Types

type Rep Instance :: Type -> Type #

Methods

from :: Instance -> Rep Instance x #

to :: Rep Instance x -> Instance #

ToJSON Instance Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

FromJSON Instance Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Instance Source # 
Instance details

Defined in Network.Google.DataFusion.Types.Product

type Rep Instance = D1 (MetaData "Instance" "Network.Google.DataFusion.Types.Product" "gogol-datafusion-0.5.0-Gq6PbGlwVWDGQzR0eMBqAg" False) (C1 (MetaCons "Instance'" PrefixI True) ((((S1 (MetaSel (Just "_iStateMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_iState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InstanceState))) :*: (S1 (MetaSel (Just "_iEnableStackdriverLogging") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_iServiceEndpoint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_iZone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_iServiceAccount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_iNetworkConfig") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe NetworkConfig)) :*: (S1 (MetaSel (Just "_iUpdateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_iPrivateInstance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))) :*: (((S1 (MetaSel (Just "_iName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_iVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_iDisplayName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_iEnableStackdriverMonitoring") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: ((S1 (MetaSel (Just "_iLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InstanceLabels)) :*: S1 (MetaSel (Just "_iOptions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InstanceOptions))) :*: (S1 (MetaSel (Just "_iType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InstanceType)) :*: (S1 (MetaSel (Just "_iDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_iCreateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))))))

iStateMessage :: Lens' Instance (Maybe Text) Source #

Output only. Additional information about the current state of this Data Fusion instance if available.

iState :: Lens' Instance (Maybe InstanceState) Source #

Output only. The current state of this Data Fusion instance.

iEnableStackdriverLogging :: Lens' Instance (Maybe Bool) Source #

Option to enable Stackdriver Logging.

iServiceEndpoint :: Lens' Instance (Maybe Text) Source #

Output only. Endpoint on which the Data Fusion UI and REST APIs are accessible.

iZone :: Lens' Instance (Maybe Text) Source #

Name of the zone in which the Data Fusion instance will be created.

iServiceAccount :: Lens' Instance (Maybe Text) Source #

Output only. Service account which will be used to access resources in the customer project."

iNetworkConfig :: Lens' Instance (Maybe NetworkConfig) Source #

Network configuration options. These are required when a private Data Fusion instance is to be created.

iUpdateTime :: Lens' Instance (Maybe UTCTime) Source #

Output only. The time the instance was last updated.

iPrivateInstance :: Lens' Instance (Maybe Bool) Source #

Specifies whether the Data Fusion instance should be private. If set to true, all Data Fusion nodes will have private IP addresses and will not be able to access the public internet.

iName :: Lens' Instance (Maybe Text) Source #

Output only. The name of this instance is in the form of projects/{project}/locations/{location}/instances/{instance}.

iVersion :: Lens' Instance (Maybe Text) Source #

Output only. Current version of the Data Fusion.

iDisplayName :: Lens' Instance (Maybe Text) Source #

Display name for an instance.

iEnableStackdriverMonitoring :: Lens' Instance (Maybe Bool) Source #

Option to enable Stackdriver Monitoring.

iLabels :: Lens' Instance (Maybe InstanceLabels) Source #

The resource labels for instance to use to annotate any related underlying resources such as GCE VMs. The character '=' is not allowed to be used within the labels.

iOptions :: Lens' Instance (Maybe InstanceOptions) Source #

Map of additional options used to configure the behavior of Data Fusion instance.

iType :: Lens' Instance (Maybe InstanceType) Source #

Required. Instance type.

iDescription :: Lens' Instance (Maybe Text) Source #

An optional description of this instance.

iCreateTime :: Lens' Instance (Maybe UTCTime) Source #

Output only. The time the instance was created.