gogol-cloudshell-0.4.0: Google Cloud Shell 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.CloudShell.Types

Contents

Description

 
Synopsis

Service Configuration

cloudShellService :: ServiceConfig Source #

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

OAuth Scopes

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

View and manage your data across Google Cloud Platform services

Status

data Status Source #

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

See: status smart constructor.

Instances
Eq Status Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Methods

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

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

Data Status Source # 
Instance details

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

Generic Status Source # 
Instance details

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

FromJSON Status Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep Status = D1 (MetaData "Status" "Network.Google.CloudShell.Types.Product" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" 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.

ListOperationsResponse

data ListOperationsResponse Source #

The response message for Operations.ListOperations.

See: listOperationsResponse smart constructor.

Instances
Eq ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data ListOperationsResponse Source # 
Instance details

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

Generic ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep ListOperationsResponse :: Type -> Type #

ToJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

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

listOperationsResponse :: ListOperationsResponse Source #

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

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

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

The standard List next-page token.

lorOperations :: Lens' ListOperationsResponse [Operation] Source #

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

CancelOperationRequest

data CancelOperationRequest Source #

The request message for Operations.CancelOperation.

See: cancelOperationRequest smart constructor.

Instances
Eq CancelOperationRequest Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data CancelOperationRequest Source # 
Instance details

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

Generic CancelOperationRequest Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep CancelOperationRequest :: Type -> Type #

ToJSON CancelOperationRequest Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON CancelOperationRequest Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep CancelOperationRequest Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep CancelOperationRequest = D1 (MetaData "CancelOperationRequest" "Network.Google.CloudShell.Types.Product" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" 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.

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

Data Operation Source # 
Instance details

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

Generic Operation Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

operation :: Operation Source #

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

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

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

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

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

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

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

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

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

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

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

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

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

Methods

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

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

Data Empty Source # 
Instance details

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

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

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

FromJSON Empty Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.CloudShell.Types.Product" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" 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.

Environment

data Environment Source #

A Cloud Shell environment, which is defined as the combination of a Docker image specifying what is installed on the environment and a home directory containing the user's data that will remain across sessions. Each user has a single environment with the ID "default".

See: environment smart constructor.

Instances
Eq Environment Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data Environment Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Methods

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

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

toConstr :: Environment -> Constr #

dataTypeOf :: Environment -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Environment Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Generic Environment Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep Environment :: Type -> Type #

ToJSON Environment Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON Environment Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep Environment Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

environment :: Environment Source #

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

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

eState :: Lens' Environment (Maybe EnvironmentState) Source #

Output only. Current execution state of this environment.

ePublicKeys :: Lens' Environment [PublicKey] Source #

Output only. Public keys associated with the environment. Clients can connect to this environment via SSH only if they possess a private key corresponding to at least one of these public keys. Keys can be added to or removed from the environment using the CreatePublicKey and DeletePublicKey methods.

eSSHUsername :: Lens' Environment (Maybe Text) Source #

Output only. Username that clients should use when initiating SSH sessions with the environment.

eName :: Lens' Environment (Maybe Text) Source #

Output only. Full name of this resource, in the format `users/{owner_email}/environments/{environment_id}`. `{owner_email}` is the email address of the user to whom this environment belongs, and `{environment_id}` is the identifier of this environment. For example, `users/someone'example.com/environments/default`.

eId :: Lens' Environment (Maybe Text) Source #

Output only. The environment's identifier, which is always "default".

eSSHHost :: Lens' Environment (Maybe Text) Source #

Output only. Host to which clients can connect to initiate SSH sessions with the environment.

eDockerImage :: Lens' Environment (Maybe Text) Source #

Required. Full path to the Docker image used to run this environment, e.g. "gcr.io/dev-con/cloud-devshell:latest".

eSSHPort :: Lens' Environment (Maybe Int32) Source #

Output only. Port to which clients can connect to initiate SSH sessions with the environment.

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data StatusDetailsItem Source # 
Instance details

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

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.CloudShell.Types.Product" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" 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.

PublicKey

data PublicKey Source #

A public SSH key, corresponding to a private SSH key held by the client.

See: publicKey smart constructor.

Instances
Eq PublicKey Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data PublicKey Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Methods

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

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

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PublicKey Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Generic PublicKey Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep PublicKey :: Type -> Type #

ToJSON PublicKey Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON PublicKey Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep PublicKey Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep PublicKey = D1 (MetaData "PublicKey" "Network.Google.CloudShell.Types.Product" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" False) (C1 (MetaCons "PublicKey'" PrefixI True) (S1 (MetaSel (Just "_pkFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PublicKeyFormat)) :*: (S1 (MetaSel (Just "_pkKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_pkName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

publicKey :: PublicKey Source #

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

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

pkFormat :: Lens' PublicKey (Maybe PublicKeyFormat) Source #

Required. Format of this key's content.

pkKey :: Lens' PublicKey (Maybe ByteString) Source #

Required. Content of this key.

pkName :: Lens' PublicKey (Maybe Text) Source #

Output only. Full name of this resource, in the format `users/{owner_email}/environments/{environment_id}/publicKeys/{key_id}`. `{owner_email}` is the email address of the user to whom the key belongs. `{environment_id}` is the identifier of the environment to which the key grants access. `{key_id}` is the unique identifier of the key. For example, `users/someone'example.com/environments/default/publicKeys/myKey`.

StartEnvironmentMetadataState

data StartEnvironmentMetadataState Source #

Current state of the environment being started.

Constructors

StateUnspecified

STATE_UNSPECIFIED The environment's start state is unknown.

Starting

STARTING The environment is in the process of being started, but no additional details are available.

UnarchivingDisk

UNARCHIVING_DISK Startup is waiting for the user's disk to be unarchived. This can happen when the user returns to Cloud Shell after not having used it for a while, and suggests that startup will take longer than normal.

Finished

FINISHED Startup is complete and the user should be able to establish an SSH connection to their environment.

Instances
Enum StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Eq StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Data StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Methods

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

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

toConstr :: StartEnvironmentMetadataState -> Constr #

dataTypeOf :: StartEnvironmentMetadataState -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Read StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Show StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Generic StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Associated Types

type Rep StartEnvironmentMetadataState :: Type -> Type #

Hashable StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

ToJSON StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

FromJSON StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

FromHttpApiData StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

ToHttpApiData StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

type Rep StartEnvironmentMetadataState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

type Rep StartEnvironmentMetadataState = D1 (MetaData "StartEnvironmentMetadataState" "Network.Google.CloudShell.Types.Sum" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" False) ((C1 (MetaCons "StateUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Starting" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "UnarchivingDisk" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Finished" PrefixI False) (U1 :: Type -> Type)))

EnvironmentState

data EnvironmentState Source #

Output only. Current execution state of this environment.

Constructors

ESStateUnspecified

STATE_UNSPECIFIED The environment's states is unknown.

ESDisabled

DISABLED The environment is not running and can't be connected to. Starting the environment will transition it to the STARTING state.

ESStarting

STARTING The environment is being started but is not yet ready to accept connections.

ESRunning

RUNNING The environment is running and ready to accept connections. It will automatically transition back to DISABLED after a period of inactivity or if another environment is started.

Instances
Enum EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Eq EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Data EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Methods

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

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

toConstr :: EnvironmentState -> Constr #

dataTypeOf :: EnvironmentState -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Read EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Show EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Generic EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Associated Types

type Rep EnvironmentState :: Type -> Type #

Hashable EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

ToJSON EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

FromJSON EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

FromHttpApiData EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

ToHttpApiData EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

type Rep EnvironmentState Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

type Rep EnvironmentState = D1 (MetaData "EnvironmentState" "Network.Google.CloudShell.Types.Sum" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" False) ((C1 (MetaCons "ESStateUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESDisabled" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ESStarting" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESRunning" 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.CloudShell.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

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

PublicKeyFormat

data PublicKeyFormat Source #

Required. Format of this key's content.

Constructors

FormatUnspecified

FORMAT_UNSPECIFIED Unknown format. Do not use.

SSHDss

SSH_DSS `ssh-dss` key format (see RFC4253).

SSHRsa

SSH_RSA `ssh-rsa` key format (see RFC4253).

EcdsaSHA2NISTP256

ECDSA_SHA2_NISTP256 `ecdsa-sha2-nistp256` key format (see RFC5656).

EcdsaSHA2NISTP384

ECDSA_SHA2_NISTP384 `ecdsa-sha2-nistp384` key format (see RFC5656).

EcdsaSHA2NISTP521

ECDSA_SHA2_NISTP521 `ecdsa-sha2-nistp521` key format (see RFC5656).

Instances
Enum PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Eq PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Data PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Methods

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

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

toConstr :: PublicKeyFormat -> Constr #

dataTypeOf :: PublicKeyFormat -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Read PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Show PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Generic PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

Associated Types

type Rep PublicKeyFormat :: Type -> Type #

Hashable PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

ToJSON PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

FromJSON PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

FromHttpApiData PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

ToHttpApiData PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

type Rep PublicKeyFormat Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Sum

type Rep PublicKeyFormat = D1 (MetaData "PublicKeyFormat" "Network.Google.CloudShell.Types.Sum" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" False) ((C1 (MetaCons "FormatUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SSHDss" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SSHRsa" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "EcdsaSHA2NISTP256" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "EcdsaSHA2NISTP384" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EcdsaSHA2NISTP521" PrefixI False) (U1 :: Type -> Type))))

StartEnvironmentMetadata

data StartEnvironmentMetadata Source #

Message included in the metadata field of operations returned from StartEnvironment.

See: startEnvironmentMetadata smart constructor.

Instances
Eq StartEnvironmentMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data StartEnvironmentMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Methods

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

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

toConstr :: StartEnvironmentMetadata -> Constr #

dataTypeOf :: StartEnvironmentMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StartEnvironmentMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Generic StartEnvironmentMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep StartEnvironmentMetadata :: Type -> Type #

ToJSON StartEnvironmentMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON StartEnvironmentMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep StartEnvironmentMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep StartEnvironmentMetadata = D1 (MetaData "StartEnvironmentMetadata" "Network.Google.CloudShell.Types.Product" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" True) (C1 (MetaCons "StartEnvironmentMetadata'" PrefixI True) (S1 (MetaSel (Just "_semState") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe StartEnvironmentMetadataState))))

startEnvironmentMetadata :: StartEnvironmentMetadata Source #

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

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

semState :: Lens' StartEnvironmentMetadata (Maybe StartEnvironmentMetadataState) Source #

Current state of the environment being started.

OperationMetadata

data OperationMetadata Source #

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

See: operationMetadata smart constructor.

Instances
Eq OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data OperationMetadata Source # 
Instance details

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

Generic OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep OperationMetadata :: Type -> Type #

ToJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

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

operationMetadata Source #

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

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

omAddtional :: Lens' OperationMetadata (HashMap Text JSONValue) Source #

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

StartEnvironmentResponse

data StartEnvironmentResponse Source #

Message included in the response field of operations returned from StartEnvironment once the operation is complete.

See: startEnvironmentResponse smart constructor.

Instances
Eq StartEnvironmentResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data StartEnvironmentResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Methods

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

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

toConstr :: StartEnvironmentResponse -> Constr #

dataTypeOf :: StartEnvironmentResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StartEnvironmentResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Generic StartEnvironmentResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep StartEnvironmentResponse :: Type -> Type #

ToJSON StartEnvironmentResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON StartEnvironmentResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep StartEnvironmentResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep StartEnvironmentResponse = D1 (MetaData "StartEnvironmentResponse" "Network.Google.CloudShell.Types.Product" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" True) (C1 (MetaCons "StartEnvironmentResponse'" PrefixI True) (S1 (MetaSel (Just "_serEnvironment") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Environment))))

startEnvironmentResponse :: StartEnvironmentResponse Source #

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

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

OperationResponse

data OperationResponse Source #

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

See: operationResponse smart constructor.

Instances
Eq OperationResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Data OperationResponse Source # 
Instance details

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

Generic OperationResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

Associated Types

type Rep OperationResponse :: Type -> Type #

ToJSON OperationResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

FromJSON OperationResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep OperationResponse Source # 
Instance details

Defined in Network.Google.CloudShell.Types.Product

type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.CloudShell.Types.Product" "gogol-cloudshell-0.4.0-KMNHOn1pnys4cz43L8cRZF" 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.