{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-binds #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.ApiGatewayV2.UpdateApi
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Updates an Api resource.
module Amazonka.ApiGatewayV2.UpdateApi
  ( -- * Creating a Request
    UpdateApi (..),
    newUpdateApi,

    -- * Request Lenses
    updateApi_apiKeySelectionExpression,
    updateApi_corsConfiguration,
    updateApi_credentialsArn,
    updateApi_description,
    updateApi_disableExecuteApiEndpoint,
    updateApi_disableSchemaValidation,
    updateApi_name,
    updateApi_routeKey,
    updateApi_routeSelectionExpression,
    updateApi_target,
    updateApi_version,
    updateApi_apiId,

    -- * Destructuring the Response
    UpdateApiResponse (..),
    newUpdateApiResponse,

    -- * Response Lenses
    updateApiResponse_apiEndpoint,
    updateApiResponse_apiGatewayManaged,
    updateApiResponse_apiId,
    updateApiResponse_apiKeySelectionExpression,
    updateApiResponse_corsConfiguration,
    updateApiResponse_createdDate,
    updateApiResponse_description,
    updateApiResponse_disableExecuteApiEndpoint,
    updateApiResponse_disableSchemaValidation,
    updateApiResponse_importInfo,
    updateApiResponse_name,
    updateApiResponse_protocolType,
    updateApiResponse_routeSelectionExpression,
    updateApiResponse_tags,
    updateApiResponse_version,
    updateApiResponse_warnings,
    updateApiResponse_httpStatus,
  )
where

import Amazonka.ApiGatewayV2.Types
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | Updates an Api.
--
-- /See:/ 'newUpdateApi' smart constructor.
data UpdateApi = UpdateApi'
  { -- | An API key selection expression. Supported only for WebSocket APIs. See
    -- <https://docs.aws.amazon.com/apigateway/latest/developerguide/apigateway-websocket-api-selection-expressions.html#apigateway-websocket-api-apikey-selection-expressions API Key Selection Expressions>.
    UpdateApi -> Maybe Text
apiKeySelectionExpression :: Prelude.Maybe Prelude.Text,
    -- | A CORS configuration. Supported only for HTTP APIs.
    UpdateApi -> Maybe Cors
corsConfiguration :: Prelude.Maybe Cors,
    -- | This property is part of quick create. It specifies the credentials
    -- required for the integration, if any. For a Lambda integration, three
    -- options are available. To specify an IAM Role for API Gateway to assume,
    -- use the role\'s Amazon Resource Name (ARN). To require that the
    -- caller\'s identity be passed through from the request, specify
    -- arn:aws:iam::*:user\/*. To use resource-based permissions on supported
    -- AWS services, don\'t specify this parameter. Currently, this property is
    -- not used for HTTP integrations. If provided, this value replaces the
    -- credentials associated with the quick create integration. Supported only
    -- for HTTP APIs.
    UpdateApi -> Maybe Text
credentialsArn :: Prelude.Maybe Prelude.Text,
    -- | The description of the API.
    UpdateApi -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | Specifies whether clients can invoke your API by using the default
    -- execute-api endpoint. By default, clients can invoke your API with the
    -- default https:\/\/{api_id}.execute-api.{region}.amazonaws.com endpoint.
    -- To require that clients use a custom domain name to invoke your API,
    -- disable the default endpoint.
    UpdateApi -> Maybe Bool
disableExecuteApiEndpoint :: Prelude.Maybe Prelude.Bool,
    -- | Avoid validating models when creating a deployment. Supported only for
    -- WebSocket APIs.
    UpdateApi -> Maybe Bool
disableSchemaValidation :: Prelude.Maybe Prelude.Bool,
    -- | The name of the API.
    UpdateApi -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | This property is part of quick create. If not specified, the route
    -- created using quick create is kept. Otherwise, this value replaces the
    -- route key of the quick create route. Additional routes may still be
    -- added after the API is updated. Supported only for HTTP APIs.
    UpdateApi -> Maybe Text
routeKey :: Prelude.Maybe Prelude.Text,
    -- | The route selection expression for the API. For HTTP APIs, the
    -- routeSelectionExpression must be ${request.method} ${request.path}. If
    -- not provided, this will be the default for HTTP APIs. This property is
    -- required for WebSocket APIs.
    UpdateApi -> Maybe Text
routeSelectionExpression :: Prelude.Maybe Prelude.Text,
    -- | This property is part of quick create. For HTTP integrations, specify a
    -- fully qualified URL. For Lambda integrations, specify a function ARN.
    -- The type of the integration will be HTTP_PROXY or AWS_PROXY,
    -- respectively. The value provided updates the integration URI and
    -- integration type. You can update a quick-created target, but you can\'t
    -- remove it from an API. Supported only for HTTP APIs.
    UpdateApi -> Maybe Text
target :: Prelude.Maybe Prelude.Text,
    -- | A version identifier for the API.
    UpdateApi -> Maybe Text
version :: Prelude.Maybe Prelude.Text,
    -- | The API identifier.
    UpdateApi -> Text
apiId :: Prelude.Text
  }
  deriving (UpdateApi -> UpdateApi -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateApi -> UpdateApi -> Bool
$c/= :: UpdateApi -> UpdateApi -> Bool
== :: UpdateApi -> UpdateApi -> Bool
$c== :: UpdateApi -> UpdateApi -> Bool
Prelude.Eq, ReadPrec [UpdateApi]
ReadPrec UpdateApi
Int -> ReadS UpdateApi
ReadS [UpdateApi]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateApi]
$creadListPrec :: ReadPrec [UpdateApi]
readPrec :: ReadPrec UpdateApi
$creadPrec :: ReadPrec UpdateApi
readList :: ReadS [UpdateApi]
$creadList :: ReadS [UpdateApi]
readsPrec :: Int -> ReadS UpdateApi
$creadsPrec :: Int -> ReadS UpdateApi
Prelude.Read, Int -> UpdateApi -> ShowS
[UpdateApi] -> ShowS
UpdateApi -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateApi] -> ShowS
$cshowList :: [UpdateApi] -> ShowS
show :: UpdateApi -> String
$cshow :: UpdateApi -> String
showsPrec :: Int -> UpdateApi -> ShowS
$cshowsPrec :: Int -> UpdateApi -> ShowS
Prelude.Show, forall x. Rep UpdateApi x -> UpdateApi
forall x. UpdateApi -> Rep UpdateApi x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UpdateApi x -> UpdateApi
$cfrom :: forall x. UpdateApi -> Rep UpdateApi x
Prelude.Generic)

-- |
-- Create a value of 'UpdateApi' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'apiKeySelectionExpression', 'updateApi_apiKeySelectionExpression' - An API key selection expression. Supported only for WebSocket APIs. See
-- <https://docs.aws.amazon.com/apigateway/latest/developerguide/apigateway-websocket-api-selection-expressions.html#apigateway-websocket-api-apikey-selection-expressions API Key Selection Expressions>.
--
-- 'corsConfiguration', 'updateApi_corsConfiguration' - A CORS configuration. Supported only for HTTP APIs.
--
-- 'credentialsArn', 'updateApi_credentialsArn' - This property is part of quick create. It specifies the credentials
-- required for the integration, if any. For a Lambda integration, three
-- options are available. To specify an IAM Role for API Gateway to assume,
-- use the role\'s Amazon Resource Name (ARN). To require that the
-- caller\'s identity be passed through from the request, specify
-- arn:aws:iam::*:user\/*. To use resource-based permissions on supported
-- AWS services, don\'t specify this parameter. Currently, this property is
-- not used for HTTP integrations. If provided, this value replaces the
-- credentials associated with the quick create integration. Supported only
-- for HTTP APIs.
--
-- 'description', 'updateApi_description' - The description of the API.
--
-- 'disableExecuteApiEndpoint', 'updateApi_disableExecuteApiEndpoint' - Specifies whether clients can invoke your API by using the default
-- execute-api endpoint. By default, clients can invoke your API with the
-- default https:\/\/{api_id}.execute-api.{region}.amazonaws.com endpoint.
-- To require that clients use a custom domain name to invoke your API,
-- disable the default endpoint.
--
-- 'disableSchemaValidation', 'updateApi_disableSchemaValidation' - Avoid validating models when creating a deployment. Supported only for
-- WebSocket APIs.
--
-- 'name', 'updateApi_name' - The name of the API.
--
-- 'routeKey', 'updateApi_routeKey' - This property is part of quick create. If not specified, the route
-- created using quick create is kept. Otherwise, this value replaces the
-- route key of the quick create route. Additional routes may still be
-- added after the API is updated. Supported only for HTTP APIs.
--
-- 'routeSelectionExpression', 'updateApi_routeSelectionExpression' - The route selection expression for the API. For HTTP APIs, the
-- routeSelectionExpression must be ${request.method} ${request.path}. If
-- not provided, this will be the default for HTTP APIs. This property is
-- required for WebSocket APIs.
--
-- 'target', 'updateApi_target' - This property is part of quick create. For HTTP integrations, specify a
-- fully qualified URL. For Lambda integrations, specify a function ARN.
-- The type of the integration will be HTTP_PROXY or AWS_PROXY,
-- respectively. The value provided updates the integration URI and
-- integration type. You can update a quick-created target, but you can\'t
-- remove it from an API. Supported only for HTTP APIs.
--
-- 'version', 'updateApi_version' - A version identifier for the API.
--
-- 'apiId', 'updateApi_apiId' - The API identifier.
newUpdateApi ::
  -- | 'apiId'
  Prelude.Text ->
  UpdateApi
newUpdateApi :: Text -> UpdateApi
newUpdateApi Text
pApiId_ =
  UpdateApi'
    { $sel:apiKeySelectionExpression:UpdateApi' :: Maybe Text
apiKeySelectionExpression =
        forall a. Maybe a
Prelude.Nothing,
      $sel:corsConfiguration:UpdateApi' :: Maybe Cors
corsConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:credentialsArn:UpdateApi' :: Maybe Text
credentialsArn = forall a. Maybe a
Prelude.Nothing,
      $sel:description:UpdateApi' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:disableExecuteApiEndpoint:UpdateApi' :: Maybe Bool
disableExecuteApiEndpoint = forall a. Maybe a
Prelude.Nothing,
      $sel:disableSchemaValidation:UpdateApi' :: Maybe Bool
disableSchemaValidation = forall a. Maybe a
Prelude.Nothing,
      $sel:name:UpdateApi' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:routeKey:UpdateApi' :: Maybe Text
routeKey = forall a. Maybe a
Prelude.Nothing,
      $sel:routeSelectionExpression:UpdateApi' :: Maybe Text
routeSelectionExpression = forall a. Maybe a
Prelude.Nothing,
      $sel:target:UpdateApi' :: Maybe Text
target = forall a. Maybe a
Prelude.Nothing,
      $sel:version:UpdateApi' :: Maybe Text
version = forall a. Maybe a
Prelude.Nothing,
      $sel:apiId:UpdateApi' :: Text
apiId = Text
pApiId_
    }

-- | An API key selection expression. Supported only for WebSocket APIs. See
-- <https://docs.aws.amazon.com/apigateway/latest/developerguide/apigateway-websocket-api-selection-expressions.html#apigateway-websocket-api-apikey-selection-expressions API Key Selection Expressions>.
updateApi_apiKeySelectionExpression :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Text)
updateApi_apiKeySelectionExpression :: Lens' UpdateApi (Maybe Text)
updateApi_apiKeySelectionExpression = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Text
apiKeySelectionExpression :: Maybe Text
$sel:apiKeySelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
apiKeySelectionExpression} -> Maybe Text
apiKeySelectionExpression) (\s :: UpdateApi
s@UpdateApi' {} Maybe Text
a -> UpdateApi
s {$sel:apiKeySelectionExpression:UpdateApi' :: Maybe Text
apiKeySelectionExpression = Maybe Text
a} :: UpdateApi)

-- | A CORS configuration. Supported only for HTTP APIs.
updateApi_corsConfiguration :: Lens.Lens' UpdateApi (Prelude.Maybe Cors)
updateApi_corsConfiguration :: Lens' UpdateApi (Maybe Cors)
updateApi_corsConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Cors
corsConfiguration :: Maybe Cors
$sel:corsConfiguration:UpdateApi' :: UpdateApi -> Maybe Cors
corsConfiguration} -> Maybe Cors
corsConfiguration) (\s :: UpdateApi
s@UpdateApi' {} Maybe Cors
a -> UpdateApi
s {$sel:corsConfiguration:UpdateApi' :: Maybe Cors
corsConfiguration = Maybe Cors
a} :: UpdateApi)

-- | This property is part of quick create. It specifies the credentials
-- required for the integration, if any. For a Lambda integration, three
-- options are available. To specify an IAM Role for API Gateway to assume,
-- use the role\'s Amazon Resource Name (ARN). To require that the
-- caller\'s identity be passed through from the request, specify
-- arn:aws:iam::*:user\/*. To use resource-based permissions on supported
-- AWS services, don\'t specify this parameter. Currently, this property is
-- not used for HTTP integrations. If provided, this value replaces the
-- credentials associated with the quick create integration. Supported only
-- for HTTP APIs.
updateApi_credentialsArn :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Text)
updateApi_credentialsArn :: Lens' UpdateApi (Maybe Text)
updateApi_credentialsArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Text
credentialsArn :: Maybe Text
$sel:credentialsArn:UpdateApi' :: UpdateApi -> Maybe Text
credentialsArn} -> Maybe Text
credentialsArn) (\s :: UpdateApi
s@UpdateApi' {} Maybe Text
a -> UpdateApi
s {$sel:credentialsArn:UpdateApi' :: Maybe Text
credentialsArn = Maybe Text
a} :: UpdateApi)

-- | The description of the API.
updateApi_description :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Text)
updateApi_description :: Lens' UpdateApi (Maybe Text)
updateApi_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Text
description :: Maybe Text
$sel:description:UpdateApi' :: UpdateApi -> Maybe Text
description} -> Maybe Text
description) (\s :: UpdateApi
s@UpdateApi' {} Maybe Text
a -> UpdateApi
s {$sel:description:UpdateApi' :: Maybe Text
description = Maybe Text
a} :: UpdateApi)

-- | Specifies whether clients can invoke your API by using the default
-- execute-api endpoint. By default, clients can invoke your API with the
-- default https:\/\/{api_id}.execute-api.{region}.amazonaws.com endpoint.
-- To require that clients use a custom domain name to invoke your API,
-- disable the default endpoint.
updateApi_disableExecuteApiEndpoint :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Bool)
updateApi_disableExecuteApiEndpoint :: Lens' UpdateApi (Maybe Bool)
updateApi_disableExecuteApiEndpoint = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Bool
disableExecuteApiEndpoint :: Maybe Bool
$sel:disableExecuteApiEndpoint:UpdateApi' :: UpdateApi -> Maybe Bool
disableExecuteApiEndpoint} -> Maybe Bool
disableExecuteApiEndpoint) (\s :: UpdateApi
s@UpdateApi' {} Maybe Bool
a -> UpdateApi
s {$sel:disableExecuteApiEndpoint:UpdateApi' :: Maybe Bool
disableExecuteApiEndpoint = Maybe Bool
a} :: UpdateApi)

-- | Avoid validating models when creating a deployment. Supported only for
-- WebSocket APIs.
updateApi_disableSchemaValidation :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Bool)
updateApi_disableSchemaValidation :: Lens' UpdateApi (Maybe Bool)
updateApi_disableSchemaValidation = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Bool
disableSchemaValidation :: Maybe Bool
$sel:disableSchemaValidation:UpdateApi' :: UpdateApi -> Maybe Bool
disableSchemaValidation} -> Maybe Bool
disableSchemaValidation) (\s :: UpdateApi
s@UpdateApi' {} Maybe Bool
a -> UpdateApi
s {$sel:disableSchemaValidation:UpdateApi' :: Maybe Bool
disableSchemaValidation = Maybe Bool
a} :: UpdateApi)

-- | The name of the API.
updateApi_name :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Text)
updateApi_name :: Lens' UpdateApi (Maybe Text)
updateApi_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Text
name :: Maybe Text
$sel:name:UpdateApi' :: UpdateApi -> Maybe Text
name} -> Maybe Text
name) (\s :: UpdateApi
s@UpdateApi' {} Maybe Text
a -> UpdateApi
s {$sel:name:UpdateApi' :: Maybe Text
name = Maybe Text
a} :: UpdateApi)

-- | This property is part of quick create. If not specified, the route
-- created using quick create is kept. Otherwise, this value replaces the
-- route key of the quick create route. Additional routes may still be
-- added after the API is updated. Supported only for HTTP APIs.
updateApi_routeKey :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Text)
updateApi_routeKey :: Lens' UpdateApi (Maybe Text)
updateApi_routeKey = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Text
routeKey :: Maybe Text
$sel:routeKey:UpdateApi' :: UpdateApi -> Maybe Text
routeKey} -> Maybe Text
routeKey) (\s :: UpdateApi
s@UpdateApi' {} Maybe Text
a -> UpdateApi
s {$sel:routeKey:UpdateApi' :: Maybe Text
routeKey = Maybe Text
a} :: UpdateApi)

-- | The route selection expression for the API. For HTTP APIs, the
-- routeSelectionExpression must be ${request.method} ${request.path}. If
-- not provided, this will be the default for HTTP APIs. This property is
-- required for WebSocket APIs.
updateApi_routeSelectionExpression :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Text)
updateApi_routeSelectionExpression :: Lens' UpdateApi (Maybe Text)
updateApi_routeSelectionExpression = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Text
routeSelectionExpression :: Maybe Text
$sel:routeSelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
routeSelectionExpression} -> Maybe Text
routeSelectionExpression) (\s :: UpdateApi
s@UpdateApi' {} Maybe Text
a -> UpdateApi
s {$sel:routeSelectionExpression:UpdateApi' :: Maybe Text
routeSelectionExpression = Maybe Text
a} :: UpdateApi)

-- | This property is part of quick create. For HTTP integrations, specify a
-- fully qualified URL. For Lambda integrations, specify a function ARN.
-- The type of the integration will be HTTP_PROXY or AWS_PROXY,
-- respectively. The value provided updates the integration URI and
-- integration type. You can update a quick-created target, but you can\'t
-- remove it from an API. Supported only for HTTP APIs.
updateApi_target :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Text)
updateApi_target :: Lens' UpdateApi (Maybe Text)
updateApi_target = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Text
target :: Maybe Text
$sel:target:UpdateApi' :: UpdateApi -> Maybe Text
target} -> Maybe Text
target) (\s :: UpdateApi
s@UpdateApi' {} Maybe Text
a -> UpdateApi
s {$sel:target:UpdateApi' :: Maybe Text
target = Maybe Text
a} :: UpdateApi)

-- | A version identifier for the API.
updateApi_version :: Lens.Lens' UpdateApi (Prelude.Maybe Prelude.Text)
updateApi_version :: Lens' UpdateApi (Maybe Text)
updateApi_version = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Maybe Text
version :: Maybe Text
$sel:version:UpdateApi' :: UpdateApi -> Maybe Text
version} -> Maybe Text
version) (\s :: UpdateApi
s@UpdateApi' {} Maybe Text
a -> UpdateApi
s {$sel:version:UpdateApi' :: Maybe Text
version = Maybe Text
a} :: UpdateApi)

-- | The API identifier.
updateApi_apiId :: Lens.Lens' UpdateApi Prelude.Text
updateApi_apiId :: Lens' UpdateApi Text
updateApi_apiId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApi' {Text
apiId :: Text
$sel:apiId:UpdateApi' :: UpdateApi -> Text
apiId} -> Text
apiId) (\s :: UpdateApi
s@UpdateApi' {} Text
a -> UpdateApi
s {$sel:apiId:UpdateApi' :: Text
apiId = Text
a} :: UpdateApi)

instance Core.AWSRequest UpdateApi where
  type AWSResponse UpdateApi = UpdateApiResponse
  request :: (Service -> Service) -> UpdateApi -> Request UpdateApi
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.patchJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy UpdateApi
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse UpdateApi)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> Object -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveJSON
      ( \Int
s ResponseHeaders
h Object
x ->
          Maybe Text
-> Maybe Bool
-> Maybe Text
-> Maybe Text
-> Maybe Cors
-> Maybe ISO8601
-> Maybe Text
-> Maybe Bool
-> Maybe Bool
-> Maybe [Text]
-> Maybe Text
-> Maybe ProtocolType
-> Maybe Text
-> Maybe (HashMap Text Text)
-> Maybe Text
-> Maybe [Text]
-> Int
-> UpdateApiResponse
UpdateApiResponse'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"apiEndpoint")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"apiGatewayManaged")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"apiId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"apiKeySelectionExpression")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"corsConfiguration")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"createdDate")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"description")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"disableExecuteApiEndpoint")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"disableSchemaValidation")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"importInfo" forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"name")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"protocolType")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"routeSelectionExpression")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"tags" forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"version")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"warnings" forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable UpdateApi where
  hashWithSalt :: Int -> UpdateApi -> Int
hashWithSalt Int
_salt UpdateApi' {Maybe Bool
Maybe Text
Maybe Cors
Text
apiId :: Text
version :: Maybe Text
target :: Maybe Text
routeSelectionExpression :: Maybe Text
routeKey :: Maybe Text
name :: Maybe Text
disableSchemaValidation :: Maybe Bool
disableExecuteApiEndpoint :: Maybe Bool
description :: Maybe Text
credentialsArn :: Maybe Text
corsConfiguration :: Maybe Cors
apiKeySelectionExpression :: Maybe Text
$sel:apiId:UpdateApi' :: UpdateApi -> Text
$sel:version:UpdateApi' :: UpdateApi -> Maybe Text
$sel:target:UpdateApi' :: UpdateApi -> Maybe Text
$sel:routeSelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
$sel:routeKey:UpdateApi' :: UpdateApi -> Maybe Text
$sel:name:UpdateApi' :: UpdateApi -> Maybe Text
$sel:disableSchemaValidation:UpdateApi' :: UpdateApi -> Maybe Bool
$sel:disableExecuteApiEndpoint:UpdateApi' :: UpdateApi -> Maybe Bool
$sel:description:UpdateApi' :: UpdateApi -> Maybe Text
$sel:credentialsArn:UpdateApi' :: UpdateApi -> Maybe Text
$sel:corsConfiguration:UpdateApi' :: UpdateApi -> Maybe Cors
$sel:apiKeySelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
apiKeySelectionExpression
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Cors
corsConfiguration
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
credentialsArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
description
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
disableExecuteApiEndpoint
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
disableSchemaValidation
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
name
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
routeKey
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
routeSelectionExpression
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
target
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
version
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
apiId

instance Prelude.NFData UpdateApi where
  rnf :: UpdateApi -> ()
rnf UpdateApi' {Maybe Bool
Maybe Text
Maybe Cors
Text
apiId :: Text
version :: Maybe Text
target :: Maybe Text
routeSelectionExpression :: Maybe Text
routeKey :: Maybe Text
name :: Maybe Text
disableSchemaValidation :: Maybe Bool
disableExecuteApiEndpoint :: Maybe Bool
description :: Maybe Text
credentialsArn :: Maybe Text
corsConfiguration :: Maybe Cors
apiKeySelectionExpression :: Maybe Text
$sel:apiId:UpdateApi' :: UpdateApi -> Text
$sel:version:UpdateApi' :: UpdateApi -> Maybe Text
$sel:target:UpdateApi' :: UpdateApi -> Maybe Text
$sel:routeSelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
$sel:routeKey:UpdateApi' :: UpdateApi -> Maybe Text
$sel:name:UpdateApi' :: UpdateApi -> Maybe Text
$sel:disableSchemaValidation:UpdateApi' :: UpdateApi -> Maybe Bool
$sel:disableExecuteApiEndpoint:UpdateApi' :: UpdateApi -> Maybe Bool
$sel:description:UpdateApi' :: UpdateApi -> Maybe Text
$sel:credentialsArn:UpdateApi' :: UpdateApi -> Maybe Text
$sel:corsConfiguration:UpdateApi' :: UpdateApi -> Maybe Cors
$sel:apiKeySelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
apiKeySelectionExpression
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Cors
corsConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
credentialsArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
disableExecuteApiEndpoint
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
disableSchemaValidation
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
routeKey
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
routeSelectionExpression
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
target
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
version
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
apiId

instance Data.ToHeaders UpdateApi where
  toHeaders :: UpdateApi -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON UpdateApi where
  toJSON :: UpdateApi -> Value
toJSON UpdateApi' {Maybe Bool
Maybe Text
Maybe Cors
Text
apiId :: Text
version :: Maybe Text
target :: Maybe Text
routeSelectionExpression :: Maybe Text
routeKey :: Maybe Text
name :: Maybe Text
disableSchemaValidation :: Maybe Bool
disableExecuteApiEndpoint :: Maybe Bool
description :: Maybe Text
credentialsArn :: Maybe Text
corsConfiguration :: Maybe Cors
apiKeySelectionExpression :: Maybe Text
$sel:apiId:UpdateApi' :: UpdateApi -> Text
$sel:version:UpdateApi' :: UpdateApi -> Maybe Text
$sel:target:UpdateApi' :: UpdateApi -> Maybe Text
$sel:routeSelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
$sel:routeKey:UpdateApi' :: UpdateApi -> Maybe Text
$sel:name:UpdateApi' :: UpdateApi -> Maybe Text
$sel:disableSchemaValidation:UpdateApi' :: UpdateApi -> Maybe Bool
$sel:disableExecuteApiEndpoint:UpdateApi' :: UpdateApi -> Maybe Bool
$sel:description:UpdateApi' :: UpdateApi -> Maybe Text
$sel:credentialsArn:UpdateApi' :: UpdateApi -> Maybe Text
$sel:corsConfiguration:UpdateApi' :: UpdateApi -> Maybe Cors
$sel:apiKeySelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"apiKeySelectionExpression" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
apiKeySelectionExpression,
            (Key
"corsConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Cors
corsConfiguration,
            (Key
"credentialsArn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
credentialsArn,
            (Key
"description" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
description,
            (Key
"disableExecuteApiEndpoint" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Bool
disableExecuteApiEndpoint,
            (Key
"disableSchemaValidation" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Bool
disableSchemaValidation,
            (Key
"name" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
name,
            (Key
"routeKey" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
routeKey,
            (Key
"routeSelectionExpression" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
routeSelectionExpression,
            (Key
"target" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
target,
            (Key
"version" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
version
          ]
      )

instance Data.ToPath UpdateApi where
  toPath :: UpdateApi -> ByteString
toPath UpdateApi' {Maybe Bool
Maybe Text
Maybe Cors
Text
apiId :: Text
version :: Maybe Text
target :: Maybe Text
routeSelectionExpression :: Maybe Text
routeKey :: Maybe Text
name :: Maybe Text
disableSchemaValidation :: Maybe Bool
disableExecuteApiEndpoint :: Maybe Bool
description :: Maybe Text
credentialsArn :: Maybe Text
corsConfiguration :: Maybe Cors
apiKeySelectionExpression :: Maybe Text
$sel:apiId:UpdateApi' :: UpdateApi -> Text
$sel:version:UpdateApi' :: UpdateApi -> Maybe Text
$sel:target:UpdateApi' :: UpdateApi -> Maybe Text
$sel:routeSelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
$sel:routeKey:UpdateApi' :: UpdateApi -> Maybe Text
$sel:name:UpdateApi' :: UpdateApi -> Maybe Text
$sel:disableSchemaValidation:UpdateApi' :: UpdateApi -> Maybe Bool
$sel:disableExecuteApiEndpoint:UpdateApi' :: UpdateApi -> Maybe Bool
$sel:description:UpdateApi' :: UpdateApi -> Maybe Text
$sel:credentialsArn:UpdateApi' :: UpdateApi -> Maybe Text
$sel:corsConfiguration:UpdateApi' :: UpdateApi -> Maybe Cors
$sel:apiKeySelectionExpression:UpdateApi' :: UpdateApi -> Maybe Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat [ByteString
"/v2/apis/", forall a. ToByteString a => a -> ByteString
Data.toBS Text
apiId]

instance Data.ToQuery UpdateApi where
  toQuery :: UpdateApi -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

-- | /See:/ 'newUpdateApiResponse' smart constructor.
data UpdateApiResponse = UpdateApiResponse'
  { -- | The URI of the API, of the form
    -- {api-id}.execute-api.{region}.amazonaws.com. The stage name is typically
    -- appended to this URI to form a complete path to a deployed API stage.
    UpdateApiResponse -> Maybe Text
apiEndpoint :: Prelude.Maybe Prelude.Text,
    -- | Specifies whether an API is managed by API Gateway. You can\'t update or
    -- delete a managed API by using API Gateway. A managed API can be deleted
    -- only through the tooling or service that created it.
    UpdateApiResponse -> Maybe Bool
apiGatewayManaged :: Prelude.Maybe Prelude.Bool,
    -- | The API ID.
    UpdateApiResponse -> Maybe Text
apiId :: Prelude.Maybe Prelude.Text,
    -- | An API key selection expression. Supported only for WebSocket APIs. See
    -- <https://docs.aws.amazon.com/apigateway/latest/developerguide/apigateway-websocket-api-selection-expressions.html#apigateway-websocket-api-apikey-selection-expressions API Key Selection Expressions>.
    UpdateApiResponse -> Maybe Text
apiKeySelectionExpression :: Prelude.Maybe Prelude.Text,
    -- | A CORS configuration. Supported only for HTTP APIs.
    UpdateApiResponse -> Maybe Cors
corsConfiguration :: Prelude.Maybe Cors,
    -- | The timestamp when the API was created.
    UpdateApiResponse -> Maybe ISO8601
createdDate :: Prelude.Maybe Data.ISO8601,
    -- | The description of the API.
    UpdateApiResponse -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | Specifies whether clients can invoke your API by using the default
    -- execute-api endpoint. By default, clients can invoke your API with the
    -- default https:\/\/{api_id}.execute-api.{region}.amazonaws.com endpoint.
    -- To require that clients use a custom domain name to invoke your API,
    -- disable the default endpoint.
    UpdateApiResponse -> Maybe Bool
disableExecuteApiEndpoint :: Prelude.Maybe Prelude.Bool,
    -- | Avoid validating models when creating a deployment. Supported only for
    -- WebSocket APIs.
    UpdateApiResponse -> Maybe Bool
disableSchemaValidation :: Prelude.Maybe Prelude.Bool,
    -- | The validation information during API import. This may include
    -- particular properties of your OpenAPI definition which are ignored
    -- during import. Supported only for HTTP APIs.
    UpdateApiResponse -> Maybe [Text]
importInfo :: Prelude.Maybe [Prelude.Text],
    -- | The name of the API.
    UpdateApiResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The API protocol.
    UpdateApiResponse -> Maybe ProtocolType
protocolType :: Prelude.Maybe ProtocolType,
    -- | The route selection expression for the API. For HTTP APIs, the
    -- routeSelectionExpression must be ${request.method} ${request.path}. If
    -- not provided, this will be the default for HTTP APIs. This property is
    -- required for WebSocket APIs.
    UpdateApiResponse -> Maybe Text
routeSelectionExpression :: Prelude.Maybe Prelude.Text,
    -- | A collection of tags associated with the API.
    UpdateApiResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | A version identifier for the API.
    UpdateApiResponse -> Maybe Text
version :: Prelude.Maybe Prelude.Text,
    -- | The warning messages reported when failonwarnings is turned on during
    -- API import.
    UpdateApiResponse -> Maybe [Text]
warnings :: Prelude.Maybe [Prelude.Text],
    -- | The response's http status code.
    UpdateApiResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (UpdateApiResponse -> UpdateApiResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateApiResponse -> UpdateApiResponse -> Bool
$c/= :: UpdateApiResponse -> UpdateApiResponse -> Bool
== :: UpdateApiResponse -> UpdateApiResponse -> Bool
$c== :: UpdateApiResponse -> UpdateApiResponse -> Bool
Prelude.Eq, ReadPrec [UpdateApiResponse]
ReadPrec UpdateApiResponse
Int -> ReadS UpdateApiResponse
ReadS [UpdateApiResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateApiResponse]
$creadListPrec :: ReadPrec [UpdateApiResponse]
readPrec :: ReadPrec UpdateApiResponse
$creadPrec :: ReadPrec UpdateApiResponse
readList :: ReadS [UpdateApiResponse]
$creadList :: ReadS [UpdateApiResponse]
readsPrec :: Int -> ReadS UpdateApiResponse
$creadsPrec :: Int -> ReadS UpdateApiResponse
Prelude.Read, Int -> UpdateApiResponse -> ShowS
[UpdateApiResponse] -> ShowS
UpdateApiResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateApiResponse] -> ShowS
$cshowList :: [UpdateApiResponse] -> ShowS
show :: UpdateApiResponse -> String
$cshow :: UpdateApiResponse -> String
showsPrec :: Int -> UpdateApiResponse -> ShowS
$cshowsPrec :: Int -> UpdateApiResponse -> ShowS
Prelude.Show, forall x. Rep UpdateApiResponse x -> UpdateApiResponse
forall x. UpdateApiResponse -> Rep UpdateApiResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UpdateApiResponse x -> UpdateApiResponse
$cfrom :: forall x. UpdateApiResponse -> Rep UpdateApiResponse x
Prelude.Generic)

-- |
-- Create a value of 'UpdateApiResponse' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'apiEndpoint', 'updateApiResponse_apiEndpoint' - The URI of the API, of the form
-- {api-id}.execute-api.{region}.amazonaws.com. The stage name is typically
-- appended to this URI to form a complete path to a deployed API stage.
--
-- 'apiGatewayManaged', 'updateApiResponse_apiGatewayManaged' - Specifies whether an API is managed by API Gateway. You can\'t update or
-- delete a managed API by using API Gateway. A managed API can be deleted
-- only through the tooling or service that created it.
--
-- 'apiId', 'updateApiResponse_apiId' - The API ID.
--
-- 'apiKeySelectionExpression', 'updateApiResponse_apiKeySelectionExpression' - An API key selection expression. Supported only for WebSocket APIs. See
-- <https://docs.aws.amazon.com/apigateway/latest/developerguide/apigateway-websocket-api-selection-expressions.html#apigateway-websocket-api-apikey-selection-expressions API Key Selection Expressions>.
--
-- 'corsConfiguration', 'updateApiResponse_corsConfiguration' - A CORS configuration. Supported only for HTTP APIs.
--
-- 'createdDate', 'updateApiResponse_createdDate' - The timestamp when the API was created.
--
-- 'description', 'updateApiResponse_description' - The description of the API.
--
-- 'disableExecuteApiEndpoint', 'updateApiResponse_disableExecuteApiEndpoint' - Specifies whether clients can invoke your API by using the default
-- execute-api endpoint. By default, clients can invoke your API with the
-- default https:\/\/{api_id}.execute-api.{region}.amazonaws.com endpoint.
-- To require that clients use a custom domain name to invoke your API,
-- disable the default endpoint.
--
-- 'disableSchemaValidation', 'updateApiResponse_disableSchemaValidation' - Avoid validating models when creating a deployment. Supported only for
-- WebSocket APIs.
--
-- 'importInfo', 'updateApiResponse_importInfo' - The validation information during API import. This may include
-- particular properties of your OpenAPI definition which are ignored
-- during import. Supported only for HTTP APIs.
--
-- 'name', 'updateApiResponse_name' - The name of the API.
--
-- 'protocolType', 'updateApiResponse_protocolType' - The API protocol.
--
-- 'routeSelectionExpression', 'updateApiResponse_routeSelectionExpression' - The route selection expression for the API. For HTTP APIs, the
-- routeSelectionExpression must be ${request.method} ${request.path}. If
-- not provided, this will be the default for HTTP APIs. This property is
-- required for WebSocket APIs.
--
-- 'tags', 'updateApiResponse_tags' - A collection of tags associated with the API.
--
-- 'version', 'updateApiResponse_version' - A version identifier for the API.
--
-- 'warnings', 'updateApiResponse_warnings' - The warning messages reported when failonwarnings is turned on during
-- API import.
--
-- 'httpStatus', 'updateApiResponse_httpStatus' - The response's http status code.
newUpdateApiResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  UpdateApiResponse
newUpdateApiResponse :: Int -> UpdateApiResponse
newUpdateApiResponse Int
pHttpStatus_ =
  UpdateApiResponse'
    { $sel:apiEndpoint:UpdateApiResponse' :: Maybe Text
apiEndpoint = forall a. Maybe a
Prelude.Nothing,
      $sel:apiGatewayManaged:UpdateApiResponse' :: Maybe Bool
apiGatewayManaged = forall a. Maybe a
Prelude.Nothing,
      $sel:apiId:UpdateApiResponse' :: Maybe Text
apiId = forall a. Maybe a
Prelude.Nothing,
      $sel:apiKeySelectionExpression:UpdateApiResponse' :: Maybe Text
apiKeySelectionExpression = forall a. Maybe a
Prelude.Nothing,
      $sel:corsConfiguration:UpdateApiResponse' :: Maybe Cors
corsConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:createdDate:UpdateApiResponse' :: Maybe ISO8601
createdDate = forall a. Maybe a
Prelude.Nothing,
      $sel:description:UpdateApiResponse' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:disableExecuteApiEndpoint:UpdateApiResponse' :: Maybe Bool
disableExecuteApiEndpoint = forall a. Maybe a
Prelude.Nothing,
      $sel:disableSchemaValidation:UpdateApiResponse' :: Maybe Bool
disableSchemaValidation = forall a. Maybe a
Prelude.Nothing,
      $sel:importInfo:UpdateApiResponse' :: Maybe [Text]
importInfo = forall a. Maybe a
Prelude.Nothing,
      $sel:name:UpdateApiResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:protocolType:UpdateApiResponse' :: Maybe ProtocolType
protocolType = forall a. Maybe a
Prelude.Nothing,
      $sel:routeSelectionExpression:UpdateApiResponse' :: Maybe Text
routeSelectionExpression = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:UpdateApiResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:version:UpdateApiResponse' :: Maybe Text
version = forall a. Maybe a
Prelude.Nothing,
      $sel:warnings:UpdateApiResponse' :: Maybe [Text]
warnings = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:UpdateApiResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The URI of the API, of the form
-- {api-id}.execute-api.{region}.amazonaws.com. The stage name is typically
-- appended to this URI to form a complete path to a deployed API stage.
updateApiResponse_apiEndpoint :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Text)
updateApiResponse_apiEndpoint :: Lens' UpdateApiResponse (Maybe Text)
updateApiResponse_apiEndpoint = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Text
apiEndpoint :: Maybe Text
$sel:apiEndpoint:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
apiEndpoint} -> Maybe Text
apiEndpoint) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Text
a -> UpdateApiResponse
s {$sel:apiEndpoint:UpdateApiResponse' :: Maybe Text
apiEndpoint = Maybe Text
a} :: UpdateApiResponse)

-- | Specifies whether an API is managed by API Gateway. You can\'t update or
-- delete a managed API by using API Gateway. A managed API can be deleted
-- only through the tooling or service that created it.
updateApiResponse_apiGatewayManaged :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Bool)
updateApiResponse_apiGatewayManaged :: Lens' UpdateApiResponse (Maybe Bool)
updateApiResponse_apiGatewayManaged = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Bool
apiGatewayManaged :: Maybe Bool
$sel:apiGatewayManaged:UpdateApiResponse' :: UpdateApiResponse -> Maybe Bool
apiGatewayManaged} -> Maybe Bool
apiGatewayManaged) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Bool
a -> UpdateApiResponse
s {$sel:apiGatewayManaged:UpdateApiResponse' :: Maybe Bool
apiGatewayManaged = Maybe Bool
a} :: UpdateApiResponse)

-- | The API ID.
updateApiResponse_apiId :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Text)
updateApiResponse_apiId :: Lens' UpdateApiResponse (Maybe Text)
updateApiResponse_apiId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Text
apiId :: Maybe Text
$sel:apiId:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
apiId} -> Maybe Text
apiId) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Text
a -> UpdateApiResponse
s {$sel:apiId:UpdateApiResponse' :: Maybe Text
apiId = Maybe Text
a} :: UpdateApiResponse)

-- | An API key selection expression. Supported only for WebSocket APIs. See
-- <https://docs.aws.amazon.com/apigateway/latest/developerguide/apigateway-websocket-api-selection-expressions.html#apigateway-websocket-api-apikey-selection-expressions API Key Selection Expressions>.
updateApiResponse_apiKeySelectionExpression :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Text)
updateApiResponse_apiKeySelectionExpression :: Lens' UpdateApiResponse (Maybe Text)
updateApiResponse_apiKeySelectionExpression = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Text
apiKeySelectionExpression :: Maybe Text
$sel:apiKeySelectionExpression:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
apiKeySelectionExpression} -> Maybe Text
apiKeySelectionExpression) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Text
a -> UpdateApiResponse
s {$sel:apiKeySelectionExpression:UpdateApiResponse' :: Maybe Text
apiKeySelectionExpression = Maybe Text
a} :: UpdateApiResponse)

-- | A CORS configuration. Supported only for HTTP APIs.
updateApiResponse_corsConfiguration :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Cors)
updateApiResponse_corsConfiguration :: Lens' UpdateApiResponse (Maybe Cors)
updateApiResponse_corsConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Cors
corsConfiguration :: Maybe Cors
$sel:corsConfiguration:UpdateApiResponse' :: UpdateApiResponse -> Maybe Cors
corsConfiguration} -> Maybe Cors
corsConfiguration) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Cors
a -> UpdateApiResponse
s {$sel:corsConfiguration:UpdateApiResponse' :: Maybe Cors
corsConfiguration = Maybe Cors
a} :: UpdateApiResponse)

-- | The timestamp when the API was created.
updateApiResponse_createdDate :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.UTCTime)
updateApiResponse_createdDate :: Lens' UpdateApiResponse (Maybe UTCTime)
updateApiResponse_createdDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe ISO8601
createdDate :: Maybe ISO8601
$sel:createdDate:UpdateApiResponse' :: UpdateApiResponse -> Maybe ISO8601
createdDate} -> Maybe ISO8601
createdDate) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe ISO8601
a -> UpdateApiResponse
s {$sel:createdDate:UpdateApiResponse' :: Maybe ISO8601
createdDate = Maybe ISO8601
a} :: UpdateApiResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | The description of the API.
updateApiResponse_description :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Text)
updateApiResponse_description :: Lens' UpdateApiResponse (Maybe Text)
updateApiResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Text
description :: Maybe Text
$sel:description:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Text
a -> UpdateApiResponse
s {$sel:description:UpdateApiResponse' :: Maybe Text
description = Maybe Text
a} :: UpdateApiResponse)

-- | Specifies whether clients can invoke your API by using the default
-- execute-api endpoint. By default, clients can invoke your API with the
-- default https:\/\/{api_id}.execute-api.{region}.amazonaws.com endpoint.
-- To require that clients use a custom domain name to invoke your API,
-- disable the default endpoint.
updateApiResponse_disableExecuteApiEndpoint :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Bool)
updateApiResponse_disableExecuteApiEndpoint :: Lens' UpdateApiResponse (Maybe Bool)
updateApiResponse_disableExecuteApiEndpoint = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Bool
disableExecuteApiEndpoint :: Maybe Bool
$sel:disableExecuteApiEndpoint:UpdateApiResponse' :: UpdateApiResponse -> Maybe Bool
disableExecuteApiEndpoint} -> Maybe Bool
disableExecuteApiEndpoint) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Bool
a -> UpdateApiResponse
s {$sel:disableExecuteApiEndpoint:UpdateApiResponse' :: Maybe Bool
disableExecuteApiEndpoint = Maybe Bool
a} :: UpdateApiResponse)

-- | Avoid validating models when creating a deployment. Supported only for
-- WebSocket APIs.
updateApiResponse_disableSchemaValidation :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Bool)
updateApiResponse_disableSchemaValidation :: Lens' UpdateApiResponse (Maybe Bool)
updateApiResponse_disableSchemaValidation = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Bool
disableSchemaValidation :: Maybe Bool
$sel:disableSchemaValidation:UpdateApiResponse' :: UpdateApiResponse -> Maybe Bool
disableSchemaValidation} -> Maybe Bool
disableSchemaValidation) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Bool
a -> UpdateApiResponse
s {$sel:disableSchemaValidation:UpdateApiResponse' :: Maybe Bool
disableSchemaValidation = Maybe Bool
a} :: UpdateApiResponse)

-- | The validation information during API import. This may include
-- particular properties of your OpenAPI definition which are ignored
-- during import. Supported only for HTTP APIs.
updateApiResponse_importInfo :: Lens.Lens' UpdateApiResponse (Prelude.Maybe [Prelude.Text])
updateApiResponse_importInfo :: Lens' UpdateApiResponse (Maybe [Text])
updateApiResponse_importInfo = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe [Text]
importInfo :: Maybe [Text]
$sel:importInfo:UpdateApiResponse' :: UpdateApiResponse -> Maybe [Text]
importInfo} -> Maybe [Text]
importInfo) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe [Text]
a -> UpdateApiResponse
s {$sel:importInfo:UpdateApiResponse' :: Maybe [Text]
importInfo = Maybe [Text]
a} :: UpdateApiResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The name of the API.
updateApiResponse_name :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Text)
updateApiResponse_name :: Lens' UpdateApiResponse (Maybe Text)
updateApiResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Text
name :: Maybe Text
$sel:name:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Text
a -> UpdateApiResponse
s {$sel:name:UpdateApiResponse' :: Maybe Text
name = Maybe Text
a} :: UpdateApiResponse)

-- | The API protocol.
updateApiResponse_protocolType :: Lens.Lens' UpdateApiResponse (Prelude.Maybe ProtocolType)
updateApiResponse_protocolType :: Lens' UpdateApiResponse (Maybe ProtocolType)
updateApiResponse_protocolType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe ProtocolType
protocolType :: Maybe ProtocolType
$sel:protocolType:UpdateApiResponse' :: UpdateApiResponse -> Maybe ProtocolType
protocolType} -> Maybe ProtocolType
protocolType) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe ProtocolType
a -> UpdateApiResponse
s {$sel:protocolType:UpdateApiResponse' :: Maybe ProtocolType
protocolType = Maybe ProtocolType
a} :: UpdateApiResponse)

-- | The route selection expression for the API. For HTTP APIs, the
-- routeSelectionExpression must be ${request.method} ${request.path}. If
-- not provided, this will be the default for HTTP APIs. This property is
-- required for WebSocket APIs.
updateApiResponse_routeSelectionExpression :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Text)
updateApiResponse_routeSelectionExpression :: Lens' UpdateApiResponse (Maybe Text)
updateApiResponse_routeSelectionExpression = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Text
routeSelectionExpression :: Maybe Text
$sel:routeSelectionExpression:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
routeSelectionExpression} -> Maybe Text
routeSelectionExpression) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Text
a -> UpdateApiResponse
s {$sel:routeSelectionExpression:UpdateApiResponse' :: Maybe Text
routeSelectionExpression = Maybe Text
a} :: UpdateApiResponse)

-- | A collection of tags associated with the API.
updateApiResponse_tags :: Lens.Lens' UpdateApiResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
updateApiResponse_tags :: Lens' UpdateApiResponse (Maybe (HashMap Text Text))
updateApiResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:UpdateApiResponse' :: UpdateApiResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe (HashMap Text Text)
a -> UpdateApiResponse
s {$sel:tags:UpdateApiResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: UpdateApiResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | A version identifier for the API.
updateApiResponse_version :: Lens.Lens' UpdateApiResponse (Prelude.Maybe Prelude.Text)
updateApiResponse_version :: Lens' UpdateApiResponse (Maybe Text)
updateApiResponse_version = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe Text
version :: Maybe Text
$sel:version:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
version} -> Maybe Text
version) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe Text
a -> UpdateApiResponse
s {$sel:version:UpdateApiResponse' :: Maybe Text
version = Maybe Text
a} :: UpdateApiResponse)

-- | The warning messages reported when failonwarnings is turned on during
-- API import.
updateApiResponse_warnings :: Lens.Lens' UpdateApiResponse (Prelude.Maybe [Prelude.Text])
updateApiResponse_warnings :: Lens' UpdateApiResponse (Maybe [Text])
updateApiResponse_warnings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Maybe [Text]
warnings :: Maybe [Text]
$sel:warnings:UpdateApiResponse' :: UpdateApiResponse -> Maybe [Text]
warnings} -> Maybe [Text]
warnings) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Maybe [Text]
a -> UpdateApiResponse
s {$sel:warnings:UpdateApiResponse' :: Maybe [Text]
warnings = Maybe [Text]
a} :: UpdateApiResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The response's http status code.
updateApiResponse_httpStatus :: Lens.Lens' UpdateApiResponse Prelude.Int
updateApiResponse_httpStatus :: Lens' UpdateApiResponse Int
updateApiResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateApiResponse' {Int
httpStatus :: Int
$sel:httpStatus:UpdateApiResponse' :: UpdateApiResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: UpdateApiResponse
s@UpdateApiResponse' {} Int
a -> UpdateApiResponse
s {$sel:httpStatus:UpdateApiResponse' :: Int
httpStatus = Int
a} :: UpdateApiResponse)

instance Prelude.NFData UpdateApiResponse where
  rnf :: UpdateApiResponse -> ()
rnf UpdateApiResponse' {Int
Maybe Bool
Maybe [Text]
Maybe Text
Maybe (HashMap Text Text)
Maybe ISO8601
Maybe Cors
Maybe ProtocolType
httpStatus :: Int
warnings :: Maybe [Text]
version :: Maybe Text
tags :: Maybe (HashMap Text Text)
routeSelectionExpression :: Maybe Text
protocolType :: Maybe ProtocolType
name :: Maybe Text
importInfo :: Maybe [Text]
disableSchemaValidation :: Maybe Bool
disableExecuteApiEndpoint :: Maybe Bool
description :: Maybe Text
createdDate :: Maybe ISO8601
corsConfiguration :: Maybe Cors
apiKeySelectionExpression :: Maybe Text
apiId :: Maybe Text
apiGatewayManaged :: Maybe Bool
apiEndpoint :: Maybe Text
$sel:httpStatus:UpdateApiResponse' :: UpdateApiResponse -> Int
$sel:warnings:UpdateApiResponse' :: UpdateApiResponse -> Maybe [Text]
$sel:version:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
$sel:tags:UpdateApiResponse' :: UpdateApiResponse -> Maybe (HashMap Text Text)
$sel:routeSelectionExpression:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
$sel:protocolType:UpdateApiResponse' :: UpdateApiResponse -> Maybe ProtocolType
$sel:name:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
$sel:importInfo:UpdateApiResponse' :: UpdateApiResponse -> Maybe [Text]
$sel:disableSchemaValidation:UpdateApiResponse' :: UpdateApiResponse -> Maybe Bool
$sel:disableExecuteApiEndpoint:UpdateApiResponse' :: UpdateApiResponse -> Maybe Bool
$sel:description:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
$sel:createdDate:UpdateApiResponse' :: UpdateApiResponse -> Maybe ISO8601
$sel:corsConfiguration:UpdateApiResponse' :: UpdateApiResponse -> Maybe Cors
$sel:apiKeySelectionExpression:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
$sel:apiId:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
$sel:apiGatewayManaged:UpdateApiResponse' :: UpdateApiResponse -> Maybe Bool
$sel:apiEndpoint:UpdateApiResponse' :: UpdateApiResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
apiEndpoint
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
apiGatewayManaged
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
apiId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
apiKeySelectionExpression
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Cors
corsConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ISO8601
createdDate
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
disableExecuteApiEndpoint
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
disableSchemaValidation
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
importInfo
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ProtocolType
protocolType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
routeSelectionExpression
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (HashMap Text Text)
tags
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
version
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
warnings
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus