gogol-genomics-0.4.0: Google Genomics 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.Genomics

Contents

Description

Uploads, processes, queries, and searches Genomics data in the cloud.

See: Genomics API Reference

Synopsis

Service Configuration

genomicsService :: ServiceConfig Source #

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

OAuth Scopes

genomicsScope :: Proxy '["https://www.googleapis.com/auth/genomics"] Source #

View and manage Genomics data

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

View and manage your data across Google Cloud Platform services

API Declaration

type GenomicsAPI = PipelinesRunResource :<|> (WorkersCheckInResource :<|> (ProjectsOperationsListResource :<|> (ProjectsOperationsGetResource :<|> ProjectsOperationsCancelResource))) Source #

Represents the entirety of the methods and resources available for the Genomics API service.

Resources

genomics.pipelines.run

genomics.projects.operations.cancel

genomics.projects.operations.get

genomics.projects.operations.list

genomics.workers.checkIn

Types

ContainerStartedEventPortMAppings

data ContainerStartedEventPortMAppings Source #

The container-to-host port mappings installed for this container. This set will contain any ports exposed using the `PUBLISH_EXPOSED_PORTS` flag as well as any specified in the `Action` definition.

See: containerStartedEventPortMAppings smart constructor.

Instances
Eq ContainerStartedEventPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ContainerStartedEventPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ContainerStartedEventPortMAppings -> Constr #

dataTypeOf :: ContainerStartedEventPortMAppings -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ContainerStartedEventPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ContainerStartedEventPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ContainerStartedEventPortMAppings :: Type -> Type #

ToJSON ContainerStartedEventPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ContainerStartedEventPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ContainerStartedEventPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ContainerStartedEventPortMAppings = D1 (MetaData "ContainerStartedEventPortMAppings" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "ContainerStartedEventPortMAppings'" PrefixI True) (S1 (MetaSel (Just "_csepmaAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text (Textual Int32)))))

containerStartedEventPortMAppings Source #

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

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

Event

data Event Source #

Carries information about events that occur during pipeline execution.

See: event smart constructor.

Instances
Eq Event Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

Data Event Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Event -> Constr #

dataTypeOf :: Event -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Event Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String #

showList :: [Event] -> ShowS #

Generic Event Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Event :: Type -> Type #

Methods

from :: Event -> Rep Event x #

to :: Rep Event x -> Event #

ToJSON Event Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Event Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Event Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Event = D1 (MetaData "Event" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Event'" PrefixI True) (S1 (MetaSel (Just "_eDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EventDetails)) :*: (S1 (MetaSel (Just "_eTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_eDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

event :: Event Source #

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

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

eDetails :: Lens' Event (Maybe EventDetails) Source #

Machine-readable details about the event.

eTimestamp :: Lens' Event (Maybe UTCTime) Source #

The time at which the event occurred.

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

A human-readable description of the event. Note that these strings can change at any time without notice. Any application logic must use the information in the `details` field.

CheckInRequestEvent

data CheckInRequestEvent Source #

A workflow specific event occurred.

See: checkInRequestEvent smart constructor.

Instances
Eq CheckInRequestEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data CheckInRequestEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: CheckInRequestEvent -> Constr #

dataTypeOf :: CheckInRequestEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CheckInRequestEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic CheckInRequestEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep CheckInRequestEvent :: Type -> Type #

ToJSON CheckInRequestEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON CheckInRequestEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CheckInRequestEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CheckInRequestEvent = D1 (MetaData "CheckInRequestEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "CheckInRequestEvent'" PrefixI True) (S1 (MetaSel (Just "_cireAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

checkInRequestEvent Source #

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

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

cireAddtional :: Lens' CheckInRequestEvent (HashMap Text JSONValue) Source #

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

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

Methods

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

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

Data Status Source # 
Instance details

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

Generic Status Source # 
Instance details

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

FromJSON Status Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Status = D1 (MetaData "Status" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" 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 #

An OperationMetadata or Metadata object. This will always be returned with the Operation.

See: operationSchema smart constructor.

Instances
Eq OperationSchema Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data OperationSchema Source # 
Instance details

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

Generic OperationSchema Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep OperationSchema :: Type -> Type #

ToJSON OperationSchema Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON OperationSchema Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationSchema Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationSchema = D1 (MetaData "OperationSchema" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" 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.

RunPipelineRequestLabels

data RunPipelineRequestLabels Source #

User-defined labels to associate with the returned operation. These labels are not propagated to any Google Cloud Platform resources used by the operation, and can be modified at any time. To associate labels with resources created while executing the operation, see the appropriate resource message (for example, `VirtualMachine`).

See: runPipelineRequestLabels smart constructor.

Instances
Eq RunPipelineRequestLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data RunPipelineRequestLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: RunPipelineRequestLabels -> Constr #

dataTypeOf :: RunPipelineRequestLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RunPipelineRequestLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic RunPipelineRequestLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep RunPipelineRequestLabels :: Type -> Type #

ToJSON RunPipelineRequestLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON RunPipelineRequestLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep RunPipelineRequestLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep RunPipelineRequestLabels = D1 (MetaData "RunPipelineRequestLabels" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "RunPipelineRequestLabels'" PrefixI True) (S1 (MetaSel (Just "_rprlAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

runPipelineRequestLabels Source #

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

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

ListOperationsResponse

data ListOperationsResponse Source #

The response message for Operations.ListOperations.

See: listOperationsResponse smart constructor.

Instances
Eq ListOperationsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ListOperationsResponse Source # 
Instance details

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

Generic ListOperationsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ListOperationsResponse :: Type -> Type #

ToJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ListOperationsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ListOperationsResponse = D1 (MetaData "ListOperationsResponse" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" 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.

FailedEvent

data FailedEvent Source #

An event generated when the execution of a pipeline has failed. Note that other events can continue to occur after this event.

See: failedEvent smart constructor.

Instances
Eq FailedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data FailedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: FailedEvent -> Constr #

dataTypeOf :: FailedEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FailedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic FailedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep FailedEvent :: Type -> Type #

ToJSON FailedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON FailedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep FailedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep FailedEvent = D1 (MetaData "FailedEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "FailedEvent'" PrefixI True) (S1 (MetaSel (Just "_feCause") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_feCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FailedEventCode))))

failedEvent :: FailedEvent Source #

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

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

feCause :: Lens' FailedEvent (Maybe Text) Source #

The human-readable description of the cause of the failure.

feCode :: Lens' FailedEvent (Maybe FailedEventCode) Source #

The Google standard error code that best describes this failure.

CancelOperationRequest

data CancelOperationRequest Source #

The request message for Operations.CancelOperation.

See: cancelOperationRequest smart constructor.

Instances
Eq CancelOperationRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data CancelOperationRequest Source # 
Instance details

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

Generic CancelOperationRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep CancelOperationRequest :: Type -> Type #

ToJSON CancelOperationRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON CancelOperationRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CancelOperationRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CancelOperationRequest = D1 (MetaData "CancelOperationRequest" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" 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.

WorkerStatus

data WorkerStatus Source #

The status of the worker VM.

See: workerStatus smart constructor.

Instances
Eq WorkerStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data WorkerStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: WorkerStatus -> Constr #

dataTypeOf :: WorkerStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Show WorkerStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic WorkerStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep WorkerStatus :: Type -> Type #

ToJSON WorkerStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON WorkerStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep WorkerStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep WorkerStatus = D1 (MetaData "WorkerStatus" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "WorkerStatus'" PrefixI True) ((S1 (MetaSel (Just "_wsTotalRamBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_wsAttachedDisks") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WorkerStatusAttachedDisks))) :*: (S1 (MetaSel (Just "_wsUptimeSeconds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_wsBootDisk") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DiskStatus)) :*: S1 (MetaSel (Just "_wsFreeRamBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))))))

workerStatus :: WorkerStatus Source #

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

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

wsBootDisk :: Lens' WorkerStatus (Maybe DiskStatus) Source #

Status of the boot disk.

ContainerStoppedEvent

data ContainerStoppedEvent Source #

An event generated when a container exits.

See: containerStoppedEvent smart constructor.

Instances
Eq ContainerStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ContainerStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ContainerStoppedEvent -> Constr #

dataTypeOf :: ContainerStoppedEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ContainerStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ContainerStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ContainerStoppedEvent :: Type -> Type #

ToJSON ContainerStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ContainerStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ContainerStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ContainerStoppedEvent = D1 (MetaData "ContainerStoppedEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "ContainerStoppedEvent'" PrefixI True) (S1 (MetaSel (Just "_cseExitStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_cseActionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_cseStderr") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

containerStoppedEvent :: ContainerStoppedEvent Source #

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

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

cseExitStatus :: Lens' ContainerStoppedEvent (Maybe Int32) Source #

The exit status of the container.

cseActionId :: Lens' ContainerStoppedEvent (Maybe Int32) Source #

The numeric ID of the action that started this container.

cseStderr :: Lens' ContainerStoppedEvent (Maybe Text) Source #

The tail end of any content written to standard error by the container. If the content emits large amounts of debugging noise or contains sensitive information, you can prevent the content from being printed by setting the `DISABLE_STANDARD_ERROR_CAPTURE` flag. Note that only a small amount of the end of the stream is captured here. The entire stream is stored in the `/google/logs` directory mounted into each action, and can be copied off the machine as described elsewhere.

CheckInResponse

data CheckInResponse Source #

The response to the CheckIn method.

See: checkInResponse smart constructor.

Instances
Eq CheckInResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data CheckInResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: CheckInResponse -> Constr #

dataTypeOf :: CheckInResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CheckInResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic CheckInResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep CheckInResponse :: Type -> Type #

ToJSON CheckInResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON CheckInResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CheckInResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CheckInResponse = D1 (MetaData "CheckInResponse" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "CheckInResponse'" PrefixI True) (S1 (MetaSel (Just "_cirDeadline") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_cirMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CheckInResponseMetadata))))

checkInResponse :: CheckInResponse Source #

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

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

cirDeadline :: Lens' CheckInResponse (Maybe UTCTime) Source #

The deadline by which the worker must request an extension. The backend will allow for network transmission time and other delays, but the worker must attempt to transmit the extension request no later than the deadline.

cirMetadata :: Lens' CheckInResponse (Maybe CheckInResponseMetadata) Source #

The metadata that describes the operation assigned to the worker.

WorkerAssignedEvent

data WorkerAssignedEvent Source #

An event generated after a worker VM has been assigned to run the pipeline.

See: workerAssignedEvent smart constructor.

Instances
Eq WorkerAssignedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data WorkerAssignedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: WorkerAssignedEvent -> Constr #

dataTypeOf :: WorkerAssignedEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show WorkerAssignedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic WorkerAssignedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep WorkerAssignedEvent :: Type -> Type #

ToJSON WorkerAssignedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON WorkerAssignedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep WorkerAssignedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep WorkerAssignedEvent = D1 (MetaData "WorkerAssignedEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "WorkerAssignedEvent'" PrefixI True) (S1 (MetaSel (Just "_waeZone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_waeInstance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

workerAssignedEvent :: WorkerAssignedEvent Source #

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

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

waeZone :: Lens' WorkerAssignedEvent (Maybe Text) Source #

The zone the worker is running in.

waeInstance :: Lens' WorkerAssignedEvent (Maybe Text) Source #

The worker's instance name.

OperationMetadataLabels

data OperationMetadataLabels Source #

Optionally provided by the caller when submitting the request that creates the operation.

See: operationMetadataLabels smart constructor.

Instances
Eq OperationMetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data OperationMetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: OperationMetadataLabels -> Constr #

dataTypeOf :: OperationMetadataLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic OperationMetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep OperationMetadataLabels :: Type -> Type #

ToJSON OperationMetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON OperationMetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationMetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationMetadataLabels = D1 (MetaData "OperationMetadataLabels" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "OperationMetadataLabels'" PrefixI True) (S1 (MetaSel (Just "_omlAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

operationMetadataLabels Source #

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

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

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

Data Operation Source # 
Instance details

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

Generic Operation Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.Genomics.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 #

If importing ReadGroupSets, an ImportReadGroupSetsResponse is returned. If importing Variants, an ImportVariantsResponse is returned. For pipelines and exports, an Empty response is returned.

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

The server-assigned name, which is only unique within the same service that originally returns it. For example: `operations/CJHU7Oi_ChDrveSpBRjfuL-qzoWAgEw`

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

An OperationMetadata or Metadata object. This will always be returned with the Operation.

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

Methods

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

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

Data Empty Source # 
Instance details

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

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

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

FromJSON Empty Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" 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.

Disk

data Disk Source #

Carries information about a disk that can be attached to a VM. See https://cloud.google.com/compute/docs/disks/performance for more information about disk type, size, and performance considerations.

See: disk smart constructor.

Instances
Eq Disk Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

Data Disk Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Disk -> Constr #

dataTypeOf :: Disk -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Disk Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

showsPrec :: Int -> Disk -> ShowS #

show :: Disk -> String #

showList :: [Disk] -> ShowS #

Generic Disk Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Disk :: Type -> Type #

Methods

from :: Disk -> Rep Disk x #

to :: Rep Disk x -> Disk #

ToJSON Disk Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Disk Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Disk Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Disk = D1 (MetaData "Disk" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Disk'" PrefixI True) ((S1 (MetaSel (Just "_dSourceImage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dSizeGb") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_dName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

disk :: Disk Source #

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

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

dSourceImage :: Lens' Disk (Maybe Text) Source #

An optional image to put on the disk before attaching it to the VM.

dSizeGb :: Lens' Disk (Maybe Int32) Source #

The size, in GB, of the disk to attach. If the size is not specified, a default is chosen to ensure reasonable I/O performance. If the disk type is specified as `local-ssd`, multiple local drives are automatically combined to provide the requested size. Note, however, that each physical SSD is 375GB in size, and no more than 8 drives can be attached to a single instance.

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

A user-supplied name for the disk. Used when mounting the disk into actions. The name must contain only upper and lowercase alphanumeric characters and hypens and cannot start with a hypen.

dType :: Lens' Disk (Maybe Text) Source #

The Compute Engine disk type. If unspecified, `pd-standard` is used.

UnexpectedExitStatusEvent

data UnexpectedExitStatusEvent Source #

An event generated when the execution of a container results in a non-zero exit status that was not otherwise ignored. Execution will continue, but only actions that are flagged as `ALWAYS_RUN` will be executed. Other actions will be skipped.

See: unexpectedExitStatusEvent smart constructor.

Instances
Eq UnexpectedExitStatusEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data UnexpectedExitStatusEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: UnexpectedExitStatusEvent -> Constr #

dataTypeOf :: UnexpectedExitStatusEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UnexpectedExitStatusEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic UnexpectedExitStatusEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep UnexpectedExitStatusEvent :: Type -> Type #

ToJSON UnexpectedExitStatusEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON UnexpectedExitStatusEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep UnexpectedExitStatusEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep UnexpectedExitStatusEvent = D1 (MetaData "UnexpectedExitStatusEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "UnexpectedExitStatusEvent'" PrefixI True) (S1 (MetaSel (Just "_ueseExitStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_ueseActionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

unexpectedExitStatusEvent :: UnexpectedExitStatusEvent Source #

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

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

ueseExitStatus :: Lens' UnexpectedExitStatusEvent (Maybe Int32) Source #

The exit status of the container.

ueseActionId :: Lens' UnexpectedExitStatusEvent (Maybe Int32) Source #

The numeric ID of the action that started the container.

DelayedEvent

data DelayedEvent Source #

An event generated whenever a resource limitation or transient error delays execution of a pipeline that was otherwise ready to run.

See: delayedEvent smart constructor.

Instances
Eq DelayedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data DelayedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: DelayedEvent -> Constr #

dataTypeOf :: DelayedEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DelayedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic DelayedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep DelayedEvent :: Type -> Type #

ToJSON DelayedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON DelayedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep DelayedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep DelayedEvent = D1 (MetaData "DelayedEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "DelayedEvent'" PrefixI True) (S1 (MetaSel (Just "_deMetrics") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_deCause") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

delayedEvent :: DelayedEvent Source #

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

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

deMetrics :: Lens' DelayedEvent [Text] Source #

If the delay was caused by a resource shortage, this field lists the Compute Engine metrics that are preventing this operation from running (for example, `CPUS` or `INSTANCES`). If the particular metric is not known, a single `UNKNOWN` metric will be present.

deCause :: Lens' DelayedEvent (Maybe Text) Source #

A textual description of the cause of the delay. The string can change without notice because it is often generated by another service (such as Compute Engine).

ActionPortMAppings

data ActionPortMAppings Source #

A map of containers to host port mappings for this container. If the container already specifies exposed ports, use the `PUBLISH_EXPOSED_PORTS` flag instead. The host port number must be less than 65536. If it is zero, an unused random port is assigned. To determine the resulting port number, consult the `ContainerStartedEvent` in the operation metadata.

See: actionPortMAppings smart constructor.

Instances
Eq ActionPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ActionPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ActionPortMAppings -> Constr #

dataTypeOf :: ActionPortMAppings -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ActionPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ActionPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ActionPortMAppings :: Type -> Type #

ToJSON ActionPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ActionPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ActionPortMAppings Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ActionPortMAppings = D1 (MetaData "ActionPortMAppings" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "ActionPortMAppings'" PrefixI True) (S1 (MetaSel (Just "_apmaAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text (Textual Int32)))))

actionPortMAppings Source #

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

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

MetadataLabels

data MetadataLabels Source #

The user-defined labels associated with this operation.

See: metadataLabels smart constructor.

Instances
Eq MetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data MetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: MetadataLabels -> Constr #

dataTypeOf :: MetadataLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic MetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep MetadataLabels :: Type -> Type #

ToJSON MetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON MetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep MetadataLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep MetadataLabels = D1 (MetaData "MetadataLabels" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "MetadataLabels'" PrefixI True) (S1 (MetaSel (Just "_mlAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

metadataLabels Source #

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

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

CheckInRequest

data CheckInRequest Source #

The parameters to the CheckIn method.

See: checkInRequest smart constructor.

Instances
Eq CheckInRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data CheckInRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: CheckInRequest -> Constr #

dataTypeOf :: CheckInRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CheckInRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic CheckInRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep CheckInRequest :: Type -> Type #

ToJSON CheckInRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON CheckInRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CheckInRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CheckInRequest = D1 (MetaData "CheckInRequest" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "CheckInRequest'" PrefixI True) ((S1 (MetaSel (Just "_cirEvent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CheckInRequestEvent)) :*: S1 (MetaSel (Just "_cirWorkerStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WorkerStatus))) :*: (S1 (MetaSel (Just "_cirResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Status)) :*: S1 (MetaSel (Just "_cirDeadlineExpired") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Empty)))))

checkInRequest :: CheckInRequest Source #

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

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

cirEvent :: Lens' CheckInRequest (Maybe CheckInRequestEvent) Source #

A workflow specific event occurred.

cirWorkerStatus :: Lens' CheckInRequest (Maybe WorkerStatus) Source #

Data about the status of the worker VM.

cirResult :: Lens' CheckInRequest (Maybe Status) Source #

The operation has finished with the given result.

cirDeadlineExpired :: Lens' CheckInRequest (Maybe Empty) Source #

The deadline has expired and the worker needs more time.

ContainerKilledEvent

data ContainerKilledEvent Source #

An event generated when a container is forcibly terminated by the worker. Currently, this only occurs when the container outlives the timeout specified by the user.

See: containerKilledEvent smart constructor.

Instances
Eq ContainerKilledEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ContainerKilledEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ContainerKilledEvent -> Constr #

dataTypeOf :: ContainerKilledEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ContainerKilledEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ContainerKilledEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ContainerKilledEvent :: Type -> Type #

ToJSON ContainerKilledEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ContainerKilledEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ContainerKilledEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ContainerKilledEvent = D1 (MetaData "ContainerKilledEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "ContainerKilledEvent'" PrefixI True) (S1 (MetaSel (Just "_ckeActionId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

containerKilledEvent :: ContainerKilledEvent Source #

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

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

ckeActionId :: Lens' ContainerKilledEvent (Maybe Int32) Source #

The numeric ID of the action that started the container.

PullStoppedEvent

data PullStoppedEvent Source #

An event generated when the worker stops pulling an image.

See: pullStoppedEvent smart constructor.

Instances
Eq PullStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data PullStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: PullStoppedEvent -> Constr #

dataTypeOf :: PullStoppedEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PullStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic PullStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep PullStoppedEvent :: Type -> Type #

ToJSON PullStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON PullStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep PullStoppedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep PullStoppedEvent = D1 (MetaData "PullStoppedEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "PullStoppedEvent'" PrefixI True) (S1 (MetaSel (Just "_pseImageURI") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

pullStoppedEvent :: PullStoppedEvent Source #

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

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

pseImageURI :: Lens' PullStoppedEvent (Maybe Text) Source #

The URI of the image that was pulled.

ActionLabels

data ActionLabels Source #

Labels to associate with the action. This field is provided to assist workflow engine authors in identifying actions (for example, to indicate what sort of action they perform, such as localization or debugging). They are returned in the operation metadata, but are otherwise ignored.

See: actionLabels smart constructor.

Instances
Eq ActionLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ActionLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ActionLabels -> Constr #

dataTypeOf :: ActionLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ActionLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ActionLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ActionLabels :: Type -> Type #

ToJSON ActionLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ActionLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ActionLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ActionLabels = D1 (MetaData "ActionLabels" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "ActionLabels'" PrefixI True) (S1 (MetaSel (Just "_alAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

actionLabels Source #

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

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

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data StatusDetailsItem Source # 
Instance details

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

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" 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.

Network

data Network Source #

VM networking options.

See: network smart constructor.

Instances
Eq Network Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

Data Network Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Network -> Constr #

dataTypeOf :: Network -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Network Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic Network Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Network :: Type -> Type #

Methods

from :: Network -> Rep Network x #

to :: Rep Network x -> Network #

ToJSON Network Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Network Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Network Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Network = D1 (MetaData "Network" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Network'" PrefixI True) (S1 (MetaSel (Just "_nUsePrivateAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_nName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_nSubnetwork") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

network :: Network Source #

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

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

nUsePrivateAddress :: Lens' Network (Maybe Bool) Source #

If set to true, do not attach a public IP address to the VM. Note that without a public IP address, additional configuration is required to allow the VM to access Google services. See https://cloud.google.com/vpc/docs/configure-private-google-access for more information.

nName :: Lens' Network (Maybe Text) Source #

The network name to attach the VM's network interface to. The value will be prefixed with `global/networks/` unless it contains a `/`, in which case it is assumed to be a fully specified network resource URL. If unspecified, the global default network is used.

nSubnetwork :: Lens' Network (Maybe Text) Source #

If the specified network is configured for custom subnet creation, the name of the subnetwork to attach the instance to must be specified here. The value is prefixed with `regions/*/subnetworks/` unless it contains a `/`, in which case it is assumed to be a fully specified subnetwork resource URL. If the `*` character appears in the value, it is replaced with the region that the virtual machine has been allocated in.

EventDetails

data EventDetails Source #

Machine-readable details about the event.

See: eventDetails smart constructor.

Instances
Eq EventDetails Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data EventDetails Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: EventDetails -> Constr #

dataTypeOf :: EventDetails -> DataType #

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

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

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

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

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

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

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

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

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

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

Show EventDetails Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic EventDetails Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep EventDetails :: Type -> Type #

ToJSON EventDetails Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON EventDetails Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep EventDetails Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep EventDetails = D1 (MetaData "EventDetails" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "EventDetails'" PrefixI True) (S1 (MetaSel (Just "_edAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

eventDetails Source #

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

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

edAddtional :: Lens' EventDetails (HashMap Text JSONValue) Source #

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

Action

data Action Source #

Specifies a single action that runs a Docker container.

See: action smart constructor.

Instances
Eq Action Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

Data Action Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Action -> Constr #

dataTypeOf :: Action -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Action Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic Action Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Action :: Type -> Type #

Methods

from :: Action -> Rep Action x #

to :: Rep Action x -> Action #

ToJSON Action Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Action Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Action Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Action = D1 (MetaData "Action" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Action'" PrefixI True) (((S1 (MetaSel (Just "_aCommands") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_aFlags") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_aEnvironment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ActionEnvironment)))) :*: (S1 (MetaSel (Just "_aCredentials") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Secret)) :*: (S1 (MetaSel (Just "_aEntrypoint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aPortMAppings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ActionPortMAppings))))) :*: ((S1 (MetaSel (Just "_aMounts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Mount])) :*: (S1 (MetaSel (Just "_aImageURI") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_aLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ActionLabels)) :*: (S1 (MetaSel (Just "_aTimeout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_aPidNamespace") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

action :: Action Source #

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

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

aCommands :: Lens' Action [Text] Source #

If specified, overrides the `CMD` specified in the container. If the container also has an `ENTRYPOINT` the values are used as entrypoint arguments. Otherwise, they are used as a command and arguments to run inside the container.

aFlags :: Lens' Action [Text] Source #

The set of flags to apply to this action.

aEnvironment :: Lens' Action (Maybe ActionEnvironment) Source #

The environment to pass into the container. This environment is merged with any values specified in the `Pipeline` message. These values overwrite any in the `Pipeline` message. In addition to the values passed here, a few other values are automatically injected into the environment. These cannot be hidden or overwritten. `GOOGLE_PIPELINE_FAILED` will be set to "1" if the pipeline failed because an action has exited with a non-zero status (and did not have the `IGNORE_EXIT_STATUS` flag set). This can be used to determine if additional debug or logging actions should execute. `GOOGLE_LAST_EXIT_STATUS` will be set to the exit status of the last non-background action that executed. This can be used by workflow engine authors to determine whether an individual action has succeeded or failed.

aCredentials :: Lens' Action (Maybe Secret) Source #

If the specified image is hosted on a private registry other than Google Container Registry, the credentials required to pull the image must be specified here as an encrypted secret. The secret must decrypt to a JSON-encoded dictionary containing both `username` and `password` keys.

aEntrypoint :: Lens' Action (Maybe Text) Source #

If specified, overrides the `ENTRYPOINT` specified in the container.

aPortMAppings :: Lens' Action (Maybe ActionPortMAppings) Source #

A map of containers to host port mappings for this container. If the container already specifies exposed ports, use the `PUBLISH_EXPOSED_PORTS` flag instead. The host port number must be less than 65536. If it is zero, an unused random port is assigned. To determine the resulting port number, consult the `ContainerStartedEvent` in the operation metadata.

aMounts :: Lens' Action [Mount] Source #

A list of mounts to make available to the action. In addition to the values specified here, every action has a special virtual disk mounted under `/google` that contains log files and other operational components.

  • '\/google\/logs' All logs written during the pipeline execution.
  • '\/google\/logs\/output' The combined standard output and standard error of all actions run as part of the pipeline execution.
  • '\/google\/logs\/action\/*\/stdout' The complete contents of each individual action's standard output.
  • '\/google\/logs\/action\/*\/stderr' The complete contents of each individual action's standard error output.

aImageURI :: Lens' Action (Maybe Text) Source #

The URI to pull the container image from. Note that all images referenced by actions in the pipeline are pulled before the first action runs. If multiple actions reference the same image, it is only pulled once, ensuring that the same image is used for all actions in a single pipeline.

aName :: Lens' Action (Maybe Text) Source #

An optional name for the container. The container hostname will be set to this name, making it useful for inter-container communication. The name must contain only upper and lowercase alphanumeric characters and hypens and cannot start with a hypen.

aLabels :: Lens' Action (Maybe ActionLabels) Source #

Labels to associate with the action. This field is provided to assist workflow engine authors in identifying actions (for example, to indicate what sort of action they perform, such as localization or debugging). They are returned in the operation metadata, but are otherwise ignored.

aTimeout :: Lens' Action (Maybe Scientific) Source #

The maximum amount of time to give the action to complete. If the action fails to complete before the timeout, it will be terminated and the exit status will be non-zero. The pipeline will continue or terminate based on the rules defined by the `ALWAYS_RUN` and `IGNORE_EXIT_STATUS` flags.

aPidNamespace :: Lens' Action (Maybe Text) Source #

The PID namespace to run the action inside. If unspecified, a separate isolated namespace is used.

Secret

data Secret Source #

Holds encrypted information that is only decrypted and stored in RAM by the worker VM when running the pipeline.

See: secret smart constructor.

Instances
Eq Secret Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

Data Secret Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Secret -> Constr #

dataTypeOf :: Secret -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Secret Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic Secret Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Secret :: Type -> Type #

Methods

from :: Secret -> Rep Secret x #

to :: Rep Secret x -> Secret #

ToJSON Secret Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Secret Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Secret Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Secret = D1 (MetaData "Secret" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Secret'" PrefixI True) (S1 (MetaSel (Just "_sKeyName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_sCipherText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

secret :: Secret Source #

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

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

sKeyName :: Lens' Secret (Maybe Text) Source #

The name of the Cloud KMS key that will be used to decrypt the secret value. The VM service account must have the required permissions and authentication scopes to invoke the `decrypt` method on the specified key.

sCipherText :: Lens' Secret (Maybe Text) Source #

The value of the cipherText response from the `encrypt` method. This field is intentionally unaudited.

WorkerStatusAttachedDisks

data WorkerStatusAttachedDisks Source #

Status of attached disks.

See: workerStatusAttachedDisks smart constructor.

Instances
Eq WorkerStatusAttachedDisks Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data WorkerStatusAttachedDisks Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: WorkerStatusAttachedDisks -> Constr #

dataTypeOf :: WorkerStatusAttachedDisks -> DataType #

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

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

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

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

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

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

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

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

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

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

Show WorkerStatusAttachedDisks Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic WorkerStatusAttachedDisks Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep WorkerStatusAttachedDisks :: Type -> Type #

ToJSON WorkerStatusAttachedDisks Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON WorkerStatusAttachedDisks Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep WorkerStatusAttachedDisks Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep WorkerStatusAttachedDisks = D1 (MetaData "WorkerStatusAttachedDisks" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "WorkerStatusAttachedDisks'" PrefixI True) (S1 (MetaSel (Just "_wsadAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text DiskStatus))))

workerStatusAttachedDisks Source #

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

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

OperationMetadataRequest

data OperationMetadataRequest Source #

The original request that started the operation. Note that this will be in current version of the API. If the operation was started with v1beta2 API and a GetOperation is performed on v1 API, a v1 request will be returned.

See: operationMetadataRequest smart constructor.

Instances
Eq OperationMetadataRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data OperationMetadataRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: OperationMetadataRequest -> Constr #

dataTypeOf :: OperationMetadataRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadataRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic OperationMetadataRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep OperationMetadataRequest :: Type -> Type #

ToJSON OperationMetadataRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON OperationMetadataRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationMetadataRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationMetadataRequest = D1 (MetaData "OperationMetadataRequest" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "OperationMetadataRequest'" PrefixI True) (S1 (MetaSel (Just "_omrAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationMetadataRequest Source #

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

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

omrAddtional :: Lens' OperationMetadataRequest (HashMap Text JSONValue) Source #

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

Resources

data Resources Source #

The system resources for the pipeline run. At least one zone or region must be specified or the pipeline run will fail.

See: resources smart constructor.

Instances
Eq Resources Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data Resources Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Resources -> Constr #

dataTypeOf :: Resources -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Resources Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic Resources Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Resources :: Type -> Type #

ToJSON Resources Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Resources Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Resources Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Resources = D1 (MetaData "Resources" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Resources'" PrefixI True) ((S1 (MetaSel (Just "_rZones") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_rRegions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_rVirtualMachine") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe VirtualMachine)) :*: S1 (MetaSel (Just "_rProjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

resources :: Resources Source #

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

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

rZones :: Lens' Resources [Text] Source #

The list of zones allowed for VM allocation. If set, the `regions` field must not be set.

rRegions :: Lens' Resources [Text] Source #

The list of regions allowed for VM allocation. If set, the `zones` field must not be set.

rVirtualMachine :: Lens' Resources (Maybe VirtualMachine) Source #

The virtual machine specification.

rProjectId :: Lens' Resources (Maybe Text) Source #

The project ID to allocate resources in.

DiskStatus

data DiskStatus Source #

The status of a disk on a VM.

See: diskStatus smart constructor.

Instances
Eq DiskStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data DiskStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: DiskStatus -> Constr #

dataTypeOf :: DiskStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DiskStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic DiskStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep DiskStatus :: Type -> Type #

ToJSON DiskStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON DiskStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep DiskStatus Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep DiskStatus = D1 (MetaData "DiskStatus" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "DiskStatus'" PrefixI True) (S1 (MetaSel (Just "_dsTotalSpaceBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_dsFreeSpaceBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))))

diskStatus :: DiskStatus Source #

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

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

VirtualMachineLabels

data VirtualMachineLabels Source #

Optional set of labels to apply to the VM and any attached disk resources. These labels must adhere to the name and value restrictions on VM labels imposed by Compute Engine. Labels applied at creation time to the VM. Applied on a best-effort basis to attached disk resources shortly after VM creation.

See: virtualMachineLabels smart constructor.

Instances
Eq VirtualMachineLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data VirtualMachineLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: VirtualMachineLabels -> Constr #

dataTypeOf :: VirtualMachineLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VirtualMachineLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic VirtualMachineLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep VirtualMachineLabels :: Type -> Type #

ToJSON VirtualMachineLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON VirtualMachineLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep VirtualMachineLabels Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep VirtualMachineLabels = D1 (MetaData "VirtualMachineLabels" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "VirtualMachineLabels'" PrefixI True) (S1 (MetaSel (Just "_vmlAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

virtualMachineLabels Source #

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

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

OperationMetadataRuntimeMetadata

data OperationMetadataRuntimeMetadata Source #

Runtime metadata on this Operation.

See: operationMetadataRuntimeMetadata smart constructor.

Instances
Eq OperationMetadataRuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data OperationMetadataRuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: OperationMetadataRuntimeMetadata -> Constr #

dataTypeOf :: OperationMetadataRuntimeMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadataRuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic OperationMetadataRuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep OperationMetadataRuntimeMetadata :: Type -> Type #

ToJSON OperationMetadataRuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON OperationMetadataRuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationMetadataRuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationMetadataRuntimeMetadata = D1 (MetaData "OperationMetadataRuntimeMetadata" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "OperationMetadataRuntimeMetadata'" PrefixI True) (S1 (MetaSel (Just "_omrmAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationMetadataRuntimeMetadata Source #

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

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

omrmAddtional :: Lens' OperationMetadataRuntimeMetadata (HashMap Text JSONValue) Source #

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

VirtualMachine

data VirtualMachine Source #

Carries information about a Compute Engine VM resource.

See: virtualMachine smart constructor.

Instances
Eq VirtualMachine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data VirtualMachine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: VirtualMachine -> Constr #

dataTypeOf :: VirtualMachine -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VirtualMachine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic VirtualMachine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep VirtualMachine :: Type -> Type #

ToJSON VirtualMachine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON VirtualMachine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep VirtualMachine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

virtualMachine :: VirtualMachine Source #

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

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

vmNetwork :: Lens' VirtualMachine (Maybe Network) Source #

The VM network configuration.

vmCPUPlatform :: Lens' VirtualMachine (Maybe Text) Source #

The CPU platform to request. An instance based on a newer platform can be allocated, but never one with fewer capabilities. The value of this parameter must be a valid Compute Engine CPU platform name (such as "Intel Skylake"). This parameter is only useful for carefully optimized work loads where the CPU platform has a significant impact. For more information about the effect of this parameter, see https://cloud.google.com/compute/docs/instances/specify-min-cpu-platform.

vmServiceAccount :: Lens' VirtualMachine (Maybe ServiceAccount) Source #

The service account to install on the VM. This account does not need any permissions other than those required by the pipeline.

vmAccelerators :: Lens' VirtualMachine [Accelerator] Source #

The list of accelerators to attach to the VM.

vmMachineType :: Lens' VirtualMachine (Maybe Text) Source #

The machine type of the virtual machine to create. Must be the short name of a standard machine type (such as "n1-standard-1") or a custom machine type (such as "custom-1-4096", where "1" indicates the number of vCPUs and "4096" indicates the memory in MB). See Creating an instance with a custom machine type for more specifications on creating a custom machine type.

vmLabels :: Lens' VirtualMachine (Maybe VirtualMachineLabels) Source #

Optional set of labels to apply to the VM and any attached disk resources. These labels must adhere to the name and value restrictions on VM labels imposed by Compute Engine. Labels applied at creation time to the VM. Applied on a best-effort basis to attached disk resources shortly after VM creation.

vmBootDiskSizeGb :: Lens' VirtualMachine (Maybe Int32) Source #

The size of the boot disk, in GB. The boot disk must be large enough to accommodate all of the Docker images from each action in the pipeline at the same time. If not specified, a small but reasonable default value is used.

vmDisks :: Lens' VirtualMachine [Disk] Source #

The list of disks to create and attach to the VM.

vmBootImage :: Lens' VirtualMachine (Maybe Text) Source #

The host operating system image to use. Currently, only Container-Optimized OS images can be used. The default value is `projects/cos-cloud/global/images/family/cos-stable`, which selects the latest stable release of Container-Optimized OS. This option is provided to allow testing against the beta release of the operating system to ensure that the new version does not interact negatively with production pipelines. To test a pipeline against the beta release of Container-Optimized OS, use the value `projects/cos-cloud/global/images/family/cos-beta`.

vmNvidiaDriverVersion :: Lens' VirtualMachine (Maybe Text) Source #

The NVIDIA driver version to use when attaching an NVIDIA GPU accelerator. The version specified here must be compatible with the GPU libraries contained in the container being executed, and must be one of the drivers hosted in the `nvidia-drivers-us-public` bucket on Google Cloud Storage.

vmPreemptible :: Lens' VirtualMachine (Maybe Bool) Source #

If true, allocate a preemptible VM.

ServiceAccount

data ServiceAccount Source #

Carries information about a Google Cloud service account.

See: serviceAccount smart constructor.

Instances
Eq ServiceAccount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ServiceAccount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ServiceAccount -> Constr #

dataTypeOf :: ServiceAccount -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ServiceAccount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ServiceAccount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ServiceAccount :: Type -> Type #

ToJSON ServiceAccount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ServiceAccount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ServiceAccount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ServiceAccount = D1 (MetaData "ServiceAccount" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "ServiceAccount'" PrefixI True) (S1 (MetaSel (Just "_saEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_saScopes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))

serviceAccount :: ServiceAccount Source #

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

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

saEmail :: Lens' ServiceAccount (Maybe Text) Source #

Email address of the service account. If not specified, the default Compute Engine service account for the project will be used.

saScopes :: Lens' ServiceAccount [Text] Source #

List of scopes to be enabled for this service account on the VM, in addition to the Cloud Genomics API scope.

CheckInResponseMetadata

data CheckInResponseMetadata Source #

The metadata that describes the operation assigned to the worker.

See: checkInResponseMetadata smart constructor.

Instances
Eq CheckInResponseMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data CheckInResponseMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: CheckInResponseMetadata -> Constr #

dataTypeOf :: CheckInResponseMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CheckInResponseMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic CheckInResponseMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep CheckInResponseMetadata :: Type -> Type #

ToJSON CheckInResponseMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON CheckInResponseMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CheckInResponseMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep CheckInResponseMetadata = D1 (MetaData "CheckInResponseMetadata" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "CheckInResponseMetadata'" PrefixI True) (S1 (MetaSel (Just "_cirmAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

checkInResponseMetadata Source #

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

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

cirmAddtional :: Lens' CheckInResponseMetadata (HashMap Text JSONValue) Source #

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

Accelerator

data Accelerator Source #

Carries information about an accelerator that can be attached to a VM.

See: accelerator smart constructor.

Instances
Eq Accelerator Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data Accelerator Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Accelerator -> Constr #

dataTypeOf :: Accelerator -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Accelerator Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic Accelerator Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Accelerator :: Type -> Type #

ToJSON Accelerator Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Accelerator Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Accelerator Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Accelerator = D1 (MetaData "Accelerator" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Accelerator'" PrefixI True) (S1 (MetaSel (Just "_aCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_aType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

accelerator :: Accelerator Source #

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

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

aCount :: Lens' Accelerator (Maybe Int64) Source #

How many accelerators of this type to attach.

aType :: Lens' Accelerator (Maybe Text) Source #

The accelerator type string (for example, "nvidia-tesla-k80"). Only NVIDIA GPU accelerators are currently supported. If an NVIDIA GPU is attached, the required runtime libraries will be made available to all containers under `/usr/local/nvidia`. The driver version to install must be specified using the NVIDIA driver version parameter on the virtual machine specification. Note that attaching a GPU increases the worker VM startup time by a few minutes.

PipelineEnvironment

data PipelineEnvironment Source #

The environment to pass into every action. Each action can also specify additional environment variables but cannot delete an entry from this map (though they can overwrite it with a different value).

See: pipelineEnvironment smart constructor.

Instances
Eq PipelineEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data PipelineEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: PipelineEnvironment -> Constr #

dataTypeOf :: PipelineEnvironment -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PipelineEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic PipelineEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep PipelineEnvironment :: Type -> Type #

ToJSON PipelineEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON PipelineEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep PipelineEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep PipelineEnvironment = D1 (MetaData "PipelineEnvironment" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "PipelineEnvironment'" PrefixI True) (S1 (MetaSel (Just "_peAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

pipelineEnvironment Source #

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

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

WorkerReleasedEvent

data WorkerReleasedEvent Source #

An event generated when the worker VM that was assigned to the pipeline has been released (deleted).

See: workerReleasedEvent smart constructor.

Instances
Eq WorkerReleasedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data WorkerReleasedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: WorkerReleasedEvent -> Constr #

dataTypeOf :: WorkerReleasedEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show WorkerReleasedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic WorkerReleasedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep WorkerReleasedEvent :: Type -> Type #

ToJSON WorkerReleasedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON WorkerReleasedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep WorkerReleasedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep WorkerReleasedEvent = D1 (MetaData "WorkerReleasedEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "WorkerReleasedEvent'" PrefixI True) (S1 (MetaSel (Just "_wreZone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_wreInstance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

workerReleasedEvent :: WorkerReleasedEvent Source #

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

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

wreZone :: Lens' WorkerReleasedEvent (Maybe Text) Source #

The zone the worker was running in.

wreInstance :: Lens' WorkerReleasedEvent (Maybe Text) Source #

The worker's instance name.

ContainerStartedEvent

data ContainerStartedEvent Source #

An event generated when a container starts.

See: containerStartedEvent smart constructor.

Instances
Eq ContainerStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ContainerStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ContainerStartedEvent -> Constr #

dataTypeOf :: ContainerStartedEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ContainerStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ContainerStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ContainerStartedEvent :: Type -> Type #

ToJSON ContainerStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ContainerStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ContainerStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ContainerStartedEvent = D1 (MetaData "ContainerStartedEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "ContainerStartedEvent'" PrefixI True) (S1 (MetaSel (Just "_cIPAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_cActionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_cPortMAppings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ContainerStartedEventPortMAppings)))))

containerStartedEvent :: ContainerStartedEvent Source #

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

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

cIPAddress :: Lens' ContainerStartedEvent (Maybe Text) Source #

The public IP address that can be used to connect to the container. This field is only populated when at least one port mapping is present. If the instance was created with a private address, this field will be empty even if port mappings exist.

cActionId :: Lens' ContainerStartedEvent (Maybe Int32) Source #

The numeric ID of the action that started this container.

cPortMAppings :: Lens' ContainerStartedEvent (Maybe ContainerStartedEventPortMAppings) Source #

The container-to-host port mappings installed for this container. This set will contain any ports exposed using the `PUBLISH_EXPOSED_PORTS` flag as well as any specified in the `Action` definition.

FailedEventCode

data FailedEventCode Source #

The Google standard error code that best describes this failure.

Constructors

OK

OK Not an error; returned on success HTTP Mapping: 200 OK

Cancelled

CANCELLED The operation was cancelled, typically by the caller. HTTP Mapping: 499 Client Closed Request

Unknown

UNKNOWN Unknown error. For example, this error may be returned when a `Status` value received from another address space belongs to an error space that is not known in this address space. Also errors raised by APIs that do not return enough error information may be converted to this error. HTTP Mapping: 500 Internal Server Error

InvalidArgument

INVALID_ARGUMENT The client specified an invalid argument. Note that this differs from `FAILED_PRECONDITION`. `INVALID_ARGUMENT` indicates arguments that are problematic regardless of the state of the system (e.g., a malformed file name). HTTP Mapping: 400 Bad Request

DeadlineExceeded

DEADLINE_EXCEEDED The deadline expired before the operation could complete. For operations that change the state of the system, this error may be returned even if the operation has completed successfully. For example, a successful response from a server could have been delayed long enough for the deadline to expire. HTTP Mapping: 504 Gateway Timeout

NotFound

NOT_FOUND Some requested entity (e.g., file or directory) was not found. Note to server developers: if a request is denied for an entire class of users, such as gradual feature rollout or undocumented whitelist, `NOT_FOUND` may be used. If a request is denied for some users within a class of users, such as user-based access control, `PERMISSION_DENIED` must be used. HTTP Mapping: 404 Not Found

AlreadyExists

ALREADY_EXISTS The entity that a client attempted to create (e.g., file or directory) already exists. HTTP Mapping: 409 Conflict

PermissionDenied

PERMISSION_DENIED The caller does not have permission to execute the specified operation. `PERMISSION_DENIED` must not be used for rejections caused by exhausting some resource (use `RESOURCE_EXHAUSTED` instead for those errors). `PERMISSION_DENIED` must not be used if the caller can not be identified (use `UNAUTHENTICATED` instead for those errors). This error code does not imply the request is valid or the requested entity exists or satisfies other pre-conditions. HTTP Mapping: 403 Forbidden

Unauthenticated

UNAUTHENTICATED The request does not have valid authentication credentials for the operation. HTTP Mapping: 401 Unauthorized

ResourceExhausted

RESOURCE_EXHAUSTED Some resource has been exhausted, perhaps a per-user quota, or perhaps the entire file system is out of space. HTTP Mapping: 429 Too Many Requests

FailedPrecondition

FAILED_PRECONDITION The operation was rejected because the system is not in a state required for the operation's execution. For example, the directory to be deleted is non-empty, an rmdir operation is applied to a non-directory, etc. Service implementors can use the following guidelines to decide between `FAILED_PRECONDITION`, `ABORTED`, and `UNAVAILABLE`: (a) Use `UNAVAILABLE` if the client can retry just the failing call. (b) Use `ABORTED` if the client should retry at a higher level (e.g., when a client-specified test-and-set fails, indicating the client should restart a read-modify-write sequence). (c) Use `FAILED_PRECONDITION` if the client should not retry until the system state has been explicitly fixed. E.g., if an "rmdir" fails because the directory is non-empty, `FAILED_PRECONDITION` should be returned since the client should not retry unless the files are deleted from the directory. HTTP Mapping: 400 Bad Request

Aborted

ABORTED The operation was aborted, typically due to a concurrency issue such as a sequencer check failure or transaction abort. See the guidelines above for deciding between `FAILED_PRECONDITION`, `ABORTED`, and `UNAVAILABLE`. HTTP Mapping: 409 Conflict

OutOfRange

OUT_OF_RANGE The operation was attempted past the valid range. E.g., seeking or reading past end-of-file. Unlike `INVALID_ARGUMENT`, this error indicates a problem that may be fixed if the system state changes. For example, a 32-bit file system will generate `INVALID_ARGUMENT` if asked to read at an offset that is not in the range [0,2^32-1], but it will generate `OUT_OF_RANGE` if asked to read from an offset past the current file size. There is a fair bit of overlap between `FAILED_PRECONDITION` and `OUT_OF_RANGE`. We recommend using `OUT_OF_RANGE` (the more specific error) when it applies so that callers who are iterating through a space can easily look for an `OUT_OF_RANGE` error to detect when they are done. HTTP Mapping: 400 Bad Request

Unimplemented

UNIMPLEMENTED The operation is not implemented or is not supported/enabled in this service. HTTP Mapping: 501 Not Implemented

Internal

INTERNAL Internal errors. This means that some invariants expected by the underlying system have been broken. This error code is reserved for serious errors. HTTP Mapping: 500 Internal Server Error

Unavailable

UNAVAILABLE The service is currently unavailable. This is most likely a transient condition, which can be corrected by retrying with a backoff. See the guidelines above for deciding between `FAILED_PRECONDITION`, `ABORTED`, and `UNAVAILABLE`. HTTP Mapping: 503 Service Unavailable

DataLoss

DATA_LOSS Unrecoverable data loss or corruption. HTTP Mapping: 500 Internal Server Error

Instances
Enum FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Eq FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Data FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Methods

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

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

toConstr :: FailedEventCode -> Constr #

dataTypeOf :: FailedEventCode -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Read FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Show FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Generic FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Associated Types

type Rep FailedEventCode :: Type -> Type #

Hashable FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

ToJSON FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

FromJSON FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

FromHttpApiData FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

ToHttpApiData FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

type Rep FailedEventCode Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

type Rep FailedEventCode = D1 (MetaData "FailedEventCode" "Network.Google.Genomics.Types.Sum" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) ((((C1 (MetaCons "OK" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Cancelled" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Unknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "InvalidArgument" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "DeadlineExceeded" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotFound" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "AlreadyExists" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PermissionDenied" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "Unauthenticated" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ResourceExhausted" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "FailedPrecondition" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Aborted" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "OutOfRange" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Unimplemented" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Internal" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Unavailable" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DataLoss" 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.Genomics.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.Genomics.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.Genomics.Types.Sum" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

RunPipelineRequest

data RunPipelineRequest Source #

The arguments to the `RunPipeline` method. The requesting user must have the `iam.serviceAccounts.actAs` permission for the Cloud Genomics service account or the request will fail.

See: runPipelineRequest smart constructor.

Instances
Eq RunPipelineRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data RunPipelineRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: RunPipelineRequest -> Constr #

dataTypeOf :: RunPipelineRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RunPipelineRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic RunPipelineRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep RunPipelineRequest :: Type -> Type #

ToJSON RunPipelineRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON RunPipelineRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep RunPipelineRequest Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep RunPipelineRequest = D1 (MetaData "RunPipelineRequest" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "RunPipelineRequest'" PrefixI True) (S1 (MetaSel (Just "_rprPipeline") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Pipeline)) :*: S1 (MetaSel (Just "_rprLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RunPipelineRequestLabels))))

runPipelineRequest :: RunPipelineRequest Source #

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

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

rprPipeline :: Lens' RunPipelineRequest (Maybe Pipeline) Source #

The description of the pipeline to run.

rprLabels :: Lens' RunPipelineRequest (Maybe RunPipelineRequestLabels) Source #

User-defined labels to associate with the returned operation. These labels are not propagated to any Google Cloud Platform resources used by the operation, and can be modified at any time. To associate labels with resources created while executing the operation, see the appropriate resource message (for example, `VirtualMachine`).

Pipeline

data Pipeline Source #

Specifies a series of actions to execute, expressed as Docker containers.

See: pipeline smart constructor.

Instances
Eq Pipeline Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data Pipeline Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Pipeline -> Constr #

dataTypeOf :: Pipeline -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Pipeline Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic Pipeline Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Pipeline :: Type -> Type #

Methods

from :: Pipeline -> Rep Pipeline x #

to :: Rep Pipeline x -> Pipeline #

ToJSON Pipeline Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Pipeline Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Pipeline Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Pipeline = D1 (MetaData "Pipeline" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Pipeline'" PrefixI True) ((S1 (MetaSel (Just "_pActions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Action])) :*: S1 (MetaSel (Just "_pEnvironment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PipelineEnvironment))) :*: (S1 (MetaSel (Just "_pResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Resources)) :*: S1 (MetaSel (Just "_pTimeout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)))))

pipeline :: Pipeline Source #

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

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

pActions :: Lens' Pipeline [Action] Source #

The list of actions to execute, in the order they are specified.

pEnvironment :: Lens' Pipeline (Maybe PipelineEnvironment) Source #

The environment to pass into every action. Each action can also specify additional environment variables but cannot delete an entry from this map (though they can overwrite it with a different value).

pResources :: Lens' Pipeline (Maybe Resources) Source #

The resources required for execution.

pTimeout :: Lens' Pipeline (Maybe Scientific) Source #

The maximum amount of time to give the pipeline to complete. This includes the time spent waiting for a worker to be allocated. If the pipeline fails to complete before the timeout, it will be cancelled and the error code will be set to DEADLINE_EXCEEDED. If unspecified, it will default to 7 days.

ImportVariantsResponse

data ImportVariantsResponse Source #

The variant data import response.

See: importVariantsResponse smart constructor.

Instances
Eq ImportVariantsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ImportVariantsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ImportVariantsResponse -> Constr #

dataTypeOf :: ImportVariantsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ImportVariantsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ImportVariantsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ImportVariantsResponse :: Type -> Type #

ToJSON ImportVariantsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ImportVariantsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ImportVariantsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ImportVariantsResponse = D1 (MetaData "ImportVariantsResponse" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "ImportVariantsResponse'" PrefixI True) (S1 (MetaSel (Just "_ivrCallSetIds") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

importVariantsResponse :: ImportVariantsResponse Source #

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

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

ivrCallSetIds :: Lens' ImportVariantsResponse [Text] Source #

IDs of the call sets created during the import.

ImportReadGroupSetsResponse

data ImportReadGroupSetsResponse Source #

The read group set import response.

See: importReadGroupSetsResponse smart constructor.

Instances
Eq ImportReadGroupSetsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ImportReadGroupSetsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ImportReadGroupSetsResponse -> Constr #

dataTypeOf :: ImportReadGroupSetsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ImportReadGroupSetsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ImportReadGroupSetsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ImportReadGroupSetsResponse :: Type -> Type #

ToJSON ImportReadGroupSetsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ImportReadGroupSetsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ImportReadGroupSetsResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ImportReadGroupSetsResponse = D1 (MetaData "ImportReadGroupSetsResponse" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "ImportReadGroupSetsResponse'" PrefixI True) (S1 (MetaSel (Just "_irgsrReadGroupSetIds") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

importReadGroupSetsResponse :: ImportReadGroupSetsResponse Source #

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

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

irgsrReadGroupSetIds :: Lens' ImportReadGroupSetsResponse [Text] Source #

IDs of the read group sets that were created.

Metadata

data Metadata Source #

Carries information about the pipeline execution that is returned in the long running operation's metadata field.

See: metadata smart constructor.

Instances
Eq Metadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data Metadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Metadata -> Constr #

dataTypeOf :: Metadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Metadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic Metadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Metadata :: Type -> Type #

Methods

from :: Metadata -> Rep Metadata x #

to :: Rep Metadata x -> Metadata #

ToJSON Metadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Metadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Metadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

metadata :: Metadata Source #

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

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

mStartTime :: Lens' Metadata (Maybe UTCTime) Source #

The first time at which resources were allocated to execute the pipeline.

mEvents :: Lens' Metadata [Event] Source #

The list of events that have happened so far during the execution of this operation.

mEndTime :: Lens' Metadata (Maybe UTCTime) Source #

The time at which execution was completed and resources were cleaned up.

mPipeline :: Lens' Metadata (Maybe Pipeline) Source #

The pipeline this operation represents.

mLabels :: Lens' Metadata (Maybe MetadataLabels) Source #

The user-defined labels associated with this operation.

mCreateTime :: Lens' Metadata (Maybe UTCTime) Source #

The time at which the operation was created by the API.

Mount

data Mount Source #

Carries information about a particular disk mount inside a container.

See: mount smart constructor.

Instances
Eq Mount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

Data Mount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: Mount -> Constr #

dataTypeOf :: Mount -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Mount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

showsPrec :: Int -> Mount -> ShowS #

show :: Mount -> String #

showList :: [Mount] -> ShowS #

Generic Mount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep Mount :: Type -> Type #

Methods

from :: Mount -> Rep Mount x #

to :: Rep Mount x -> Mount #

ToJSON Mount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON Mount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Mount Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep Mount = D1 (MetaData "Mount" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "Mount'" PrefixI True) (S1 (MetaSel (Just "_mPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_mDisk") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_mReadOnly") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

mount :: Mount Source #

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

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

mPath :: Lens' Mount (Maybe Text) Source #

The path to mount the disk inside the container.

mDisk :: Lens' Mount (Maybe Text) Source #

The name of the disk to mount, as specified in the resources section.

mReadOnly :: Lens' Mount (Maybe Bool) Source #

If true, the disk is mounted read-only inside the container.

PullStartedEvent

data PullStartedEvent Source #

An event generated when the worker starts pulling an image.

See: pullStartedEvent smart constructor.

Instances
Eq PullStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data PullStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: PullStartedEvent -> Constr #

dataTypeOf :: PullStartedEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PullStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic PullStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep PullStartedEvent :: Type -> Type #

ToJSON PullStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON PullStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep PullStartedEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep PullStartedEvent = D1 (MetaData "PullStartedEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "PullStartedEvent'" PrefixI True) (S1 (MetaSel (Just "_pImageURI") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

pullStartedEvent :: PullStartedEvent Source #

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

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

pImageURI :: Lens' PullStartedEvent (Maybe Text) Source #

The URI of the image that was pulled.

RunPipelineResponse

data RunPipelineResponse Source #

The response to the RunPipeline method, returned in the operation's result field on success.

See: runPipelineResponse smart constructor.

Instances
Eq RunPipelineResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data RunPipelineResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: RunPipelineResponse -> Constr #

dataTypeOf :: RunPipelineResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RunPipelineResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic RunPipelineResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep RunPipelineResponse :: Type -> Type #

ToJSON RunPipelineResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON RunPipelineResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep RunPipelineResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep RunPipelineResponse = D1 (MetaData "RunPipelineResponse" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "RunPipelineResponse'" PrefixI False) (U1 :: Type -> Type))

runPipelineResponse :: RunPipelineResponse Source #

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

OperationMetadata

data OperationMetadata Source #

Metadata describing an Operation.

See: operationMetadata smart constructor.

Instances
Eq OperationMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data OperationMetadata Source # 
Instance details

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

Generic OperationMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep OperationMetadata :: Type -> Type #

ToJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

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:

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

This field is deprecated. Use `labels` instead. Optionally provided by the caller when submitting the request that creates the operation.

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

The time at which the job began to run.

omEvents :: Lens' OperationMetadata [OperationEvent] Source #

Optional event messages that were generated during the job's execution. This also contains any warnings that were generated during import or export.

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

The time at which the job stopped running.

omLabels :: Lens' OperationMetadata (Maybe OperationMetadataLabels) Source #

Optionally provided by the caller when submitting the request that creates the operation.

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

The Google Cloud Project in which the job is scoped.

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

The time at which the job was submitted to the Genomics service.

omRequest :: Lens' OperationMetadata (Maybe OperationMetadataRequest) Source #

The original request that started the operation. Note that this will be in current version of the API. If the operation was started with v1beta2 API and a GetOperation is performed on v1 API, a v1 request will be returned.

ActionEnvironment

data ActionEnvironment Source #

The environment to pass into the container. This environment is merged with any values specified in the `Pipeline` message. These values overwrite any in the `Pipeline` message. In addition to the values passed here, a few other values are automatically injected into the environment. These cannot be hidden or overwritten. `GOOGLE_PIPELINE_FAILED` will be set to "1" if the pipeline failed because an action has exited with a non-zero status (and did not have the `IGNORE_EXIT_STATUS` flag set). This can be used to determine if additional debug or logging actions should execute. `GOOGLE_LAST_EXIT_STATUS` will be set to the exit status of the last non-background action that executed. This can be used by workflow engine authors to determine whether an individual action has succeeded or failed.

See: actionEnvironment smart constructor.

Instances
Eq ActionEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ActionEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ActionEnvironment -> Constr #

dataTypeOf :: ActionEnvironment -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ActionEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ActionEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ActionEnvironment :: Type -> Type #

ToJSON ActionEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ActionEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ActionEnvironment Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ActionEnvironment = D1 (MetaData "ActionEnvironment" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "ActionEnvironment'" PrefixI True) (S1 (MetaSel (Just "_aeAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

actionEnvironment Source #

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

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

ComputeEngine

data ComputeEngine Source #

Describes a Compute Engine resource that is being managed by a running pipeline.

See: computeEngine smart constructor.

Instances
Eq ComputeEngine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data ComputeEngine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: ComputeEngine -> Constr #

dataTypeOf :: ComputeEngine -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ComputeEngine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic ComputeEngine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep ComputeEngine :: Type -> Type #

ToJSON ComputeEngine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON ComputeEngine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ComputeEngine Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep ComputeEngine = D1 (MetaData "ComputeEngine" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "ComputeEngine'" PrefixI True) ((S1 (MetaSel (Just "_ceZone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ceDiskNames") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_ceMachineType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ceInstanceName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

computeEngine :: ComputeEngine Source #

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

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

ceZone :: Lens' ComputeEngine (Maybe Text) Source #

The availability zone in which the instance resides.

ceDiskNames :: Lens' ComputeEngine [Text] Source #

The names of the disks that were created for this pipeline.

ceMachineType :: Lens' ComputeEngine (Maybe Text) Source #

The machine type of the instance.

ceInstanceName :: Lens' ComputeEngine (Maybe Text) Source #

The instance on which the operation is running.

OperationResponse

data OperationResponse Source #

If importing ReadGroupSets, an ImportReadGroupSetsResponse is returned. If importing Variants, an ImportVariantsResponse is returned. For pipelines and exports, an Empty response is returned.

See: operationResponse smart constructor.

Instances
Eq OperationResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data OperationResponse Source # 
Instance details

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

Generic OperationResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep OperationResponse :: Type -> Type #

ToJSON OperationResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON OperationResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationResponse Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" 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.

OperationEvent

data OperationEvent Source #

An event that occurred during an Operation.

See: operationEvent smart constructor.

Instances
Eq OperationEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data OperationEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: OperationEvent -> Constr #

dataTypeOf :: OperationEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic OperationEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep OperationEvent :: Type -> Type #

ToJSON OperationEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON OperationEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationEvent Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep OperationEvent = D1 (MetaData "OperationEvent" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" False) (C1 (MetaCons "OperationEvent'" PrefixI True) (S1 (MetaSel (Just "_oeStartTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: (S1 (MetaSel (Just "_oeEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_oeDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

operationEvent :: OperationEvent Source #

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

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

oeStartTime :: Lens' OperationEvent (Maybe UTCTime) Source #

Optional time of when event started.

oeEndTime :: Lens' OperationEvent (Maybe UTCTime) Source #

Optional time of when event finished. An event can have a start time and no finish time. If an event has a finish time, there must be a start time.

oeDescription :: Lens' OperationEvent (Maybe Text) Source #

Required description of event.

RuntimeMetadata

data RuntimeMetadata Source #

Runtime metadata that will be populated in the runtimeMetadata field of the Operation associated with a RunPipeline execution.

See: runtimeMetadata smart constructor.

Instances
Eq RuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Data RuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Methods

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

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

toConstr :: RuntimeMetadata -> Constr #

dataTypeOf :: RuntimeMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Generic RuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

Associated Types

type Rep RuntimeMetadata :: Type -> Type #

ToJSON RuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

FromJSON RuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep RuntimeMetadata Source # 
Instance details

Defined in Network.Google.Genomics.Types.Product

type Rep RuntimeMetadata = D1 (MetaData "RuntimeMetadata" "Network.Google.Genomics.Types.Product" "gogol-genomics-0.4.0-63oTcGDCcdz79Wan6imH0i" True) (C1 (MetaCons "RuntimeMetadata'" PrefixI True) (S1 (MetaSel (Just "_rmComputeEngine") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ComputeEngine))))

runtimeMetadata :: RuntimeMetadata Source #

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

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

rmComputeEngine :: Lens' RuntimeMetadata (Maybe ComputeEngine) Source #

Execution information specific to Google Compute Engine.