{-# 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.ReimportApi
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Puts an Api resource.
module Amazonka.ApiGatewayV2.ReimportApi
  ( -- * Creating a Request
    ReimportApi (..),
    newReimportApi,

    -- * Request Lenses
    reimportApi_basepath,
    reimportApi_failOnWarnings,
    reimportApi_apiId,
    reimportApi_body,

    -- * Destructuring the Response
    ReimportApiResponse (..),
    newReimportApiResponse,

    -- * Response Lenses
    reimportApiResponse_apiEndpoint,
    reimportApiResponse_apiGatewayManaged,
    reimportApiResponse_apiId,
    reimportApiResponse_apiKeySelectionExpression,
    reimportApiResponse_corsConfiguration,
    reimportApiResponse_createdDate,
    reimportApiResponse_description,
    reimportApiResponse_disableExecuteApiEndpoint,
    reimportApiResponse_disableSchemaValidation,
    reimportApiResponse_importInfo,
    reimportApiResponse_name,
    reimportApiResponse_protocolType,
    reimportApiResponse_routeSelectionExpression,
    reimportApiResponse_tags,
    reimportApiResponse_version,
    reimportApiResponse_warnings,
    reimportApiResponse_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

-- |
--
-- /See:/ 'newReimportApi' smart constructor.
data ReimportApi = ReimportApi'
  { -- | Specifies how to interpret the base path of the API during import. Valid
    -- values are ignore, prepend, and split. The default value is ignore. To
    -- learn more, see
    -- <https://docs.aws.amazon.com/apigateway/latest/developerguide/api-gateway-import-api-basePath.html Set the OpenAPI basePath Property>.
    -- Supported only for HTTP APIs.
    ReimportApi -> Maybe Text
basepath :: Prelude.Maybe Prelude.Text,
    -- | Specifies whether to rollback the API creation when a warning is
    -- encountered. By default, API creation continues if a warning is
    -- encountered.
    ReimportApi -> Maybe Bool
failOnWarnings :: Prelude.Maybe Prelude.Bool,
    -- | The API identifier.
    ReimportApi -> Text
apiId :: Prelude.Text,
    -- | The OpenAPI definition. Supported only for HTTP APIs.
    ReimportApi -> Text
body :: Prelude.Text
  }
  deriving (ReimportApi -> ReimportApi -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ReimportApi -> ReimportApi -> Bool
$c/= :: ReimportApi -> ReimportApi -> Bool
== :: ReimportApi -> ReimportApi -> Bool
$c== :: ReimportApi -> ReimportApi -> Bool
Prelude.Eq, ReadPrec [ReimportApi]
ReadPrec ReimportApi
Int -> ReadS ReimportApi
ReadS [ReimportApi]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ReimportApi]
$creadListPrec :: ReadPrec [ReimportApi]
readPrec :: ReadPrec ReimportApi
$creadPrec :: ReadPrec ReimportApi
readList :: ReadS [ReimportApi]
$creadList :: ReadS [ReimportApi]
readsPrec :: Int -> ReadS ReimportApi
$creadsPrec :: Int -> ReadS ReimportApi
Prelude.Read, Int -> ReimportApi -> ShowS
[ReimportApi] -> ShowS
ReimportApi -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ReimportApi] -> ShowS
$cshowList :: [ReimportApi] -> ShowS
show :: ReimportApi -> String
$cshow :: ReimportApi -> String
showsPrec :: Int -> ReimportApi -> ShowS
$cshowsPrec :: Int -> ReimportApi -> ShowS
Prelude.Show, forall x. Rep ReimportApi x -> ReimportApi
forall x. ReimportApi -> Rep ReimportApi x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ReimportApi x -> ReimportApi
$cfrom :: forall x. ReimportApi -> Rep ReimportApi x
Prelude.Generic)

-- |
-- Create a value of 'ReimportApi' 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:
--
-- 'basepath', 'reimportApi_basepath' - Specifies how to interpret the base path of the API during import. Valid
-- values are ignore, prepend, and split. The default value is ignore. To
-- learn more, see
-- <https://docs.aws.amazon.com/apigateway/latest/developerguide/api-gateway-import-api-basePath.html Set the OpenAPI basePath Property>.
-- Supported only for HTTP APIs.
--
-- 'failOnWarnings', 'reimportApi_failOnWarnings' - Specifies whether to rollback the API creation when a warning is
-- encountered. By default, API creation continues if a warning is
-- encountered.
--
-- 'apiId', 'reimportApi_apiId' - The API identifier.
--
-- 'body', 'reimportApi_body' - The OpenAPI definition. Supported only for HTTP APIs.
newReimportApi ::
  -- | 'apiId'
  Prelude.Text ->
  -- | 'body'
  Prelude.Text ->
  ReimportApi
newReimportApi :: Text -> Text -> ReimportApi
newReimportApi Text
pApiId_ Text
pBody_ =
  ReimportApi'
    { $sel:basepath:ReimportApi' :: Maybe Text
basepath = forall a. Maybe a
Prelude.Nothing,
      $sel:failOnWarnings:ReimportApi' :: Maybe Bool
failOnWarnings = forall a. Maybe a
Prelude.Nothing,
      $sel:apiId:ReimportApi' :: Text
apiId = Text
pApiId_,
      $sel:body:ReimportApi' :: Text
body = Text
pBody_
    }

-- | Specifies how to interpret the base path of the API during import. Valid
-- values are ignore, prepend, and split. The default value is ignore. To
-- learn more, see
-- <https://docs.aws.amazon.com/apigateway/latest/developerguide/api-gateway-import-api-basePath.html Set the OpenAPI basePath Property>.
-- Supported only for HTTP APIs.
reimportApi_basepath :: Lens.Lens' ReimportApi (Prelude.Maybe Prelude.Text)
reimportApi_basepath :: Lens' ReimportApi (Maybe Text)
reimportApi_basepath = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApi' {Maybe Text
basepath :: Maybe Text
$sel:basepath:ReimportApi' :: ReimportApi -> Maybe Text
basepath} -> Maybe Text
basepath) (\s :: ReimportApi
s@ReimportApi' {} Maybe Text
a -> ReimportApi
s {$sel:basepath:ReimportApi' :: Maybe Text
basepath = Maybe Text
a} :: ReimportApi)

-- | Specifies whether to rollback the API creation when a warning is
-- encountered. By default, API creation continues if a warning is
-- encountered.
reimportApi_failOnWarnings :: Lens.Lens' ReimportApi (Prelude.Maybe Prelude.Bool)
reimportApi_failOnWarnings :: Lens' ReimportApi (Maybe Bool)
reimportApi_failOnWarnings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApi' {Maybe Bool
failOnWarnings :: Maybe Bool
$sel:failOnWarnings:ReimportApi' :: ReimportApi -> Maybe Bool
failOnWarnings} -> Maybe Bool
failOnWarnings) (\s :: ReimportApi
s@ReimportApi' {} Maybe Bool
a -> ReimportApi
s {$sel:failOnWarnings:ReimportApi' :: Maybe Bool
failOnWarnings = Maybe Bool
a} :: ReimportApi)

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

-- | The OpenAPI definition. Supported only for HTTP APIs.
reimportApi_body :: Lens.Lens' ReimportApi Prelude.Text
reimportApi_body :: Lens' ReimportApi Text
reimportApi_body = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApi' {Text
body :: Text
$sel:body:ReimportApi' :: ReimportApi -> Text
body} -> Text
body) (\s :: ReimportApi
s@ReimportApi' {} Text
a -> ReimportApi
s {$sel:body:ReimportApi' :: Text
body = Text
a} :: ReimportApi)

instance Core.AWSRequest ReimportApi where
  type AWSResponse ReimportApi = ReimportApiResponse
  request :: (Service -> Service) -> ReimportApi -> Request ReimportApi
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.putJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy ReimportApi
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse ReimportApi)))
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
-> ReimportApiResponse
ReimportApiResponse'
            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 ReimportApi where
  hashWithSalt :: Int -> ReimportApi -> Int
hashWithSalt Int
_salt ReimportApi' {Maybe Bool
Maybe Text
Text
body :: Text
apiId :: Text
failOnWarnings :: Maybe Bool
basepath :: Maybe Text
$sel:body:ReimportApi' :: ReimportApi -> Text
$sel:apiId:ReimportApi' :: ReimportApi -> Text
$sel:failOnWarnings:ReimportApi' :: ReimportApi -> Maybe Bool
$sel:basepath:ReimportApi' :: ReimportApi -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
basepath
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
failOnWarnings
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
apiId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
body

instance Prelude.NFData ReimportApi where
  rnf :: ReimportApi -> ()
rnf ReimportApi' {Maybe Bool
Maybe Text
Text
body :: Text
apiId :: Text
failOnWarnings :: Maybe Bool
basepath :: Maybe Text
$sel:body:ReimportApi' :: ReimportApi -> Text
$sel:apiId:ReimportApi' :: ReimportApi -> Text
$sel:failOnWarnings:ReimportApi' :: ReimportApi -> Maybe Bool
$sel:basepath:ReimportApi' :: ReimportApi -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
basepath
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
failOnWarnings
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
apiId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
body

instance Data.ToHeaders ReimportApi where
  toHeaders :: ReimportApi -> 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 ReimportApi where
  toJSON :: ReimportApi -> Value
toJSON ReimportApi' {Maybe Bool
Maybe Text
Text
body :: Text
apiId :: Text
failOnWarnings :: Maybe Bool
basepath :: Maybe Text
$sel:body:ReimportApi' :: ReimportApi -> Text
$sel:apiId:ReimportApi' :: ReimportApi -> Text
$sel:failOnWarnings:ReimportApi' :: ReimportApi -> Maybe Bool
$sel:basepath:ReimportApi' :: ReimportApi -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [forall a. a -> Maybe a
Prelude.Just (Key
"body" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
body)]
      )

instance Data.ToPath ReimportApi where
  toPath :: ReimportApi -> ByteString
toPath ReimportApi' {Maybe Bool
Maybe Text
Text
body :: Text
apiId :: Text
failOnWarnings :: Maybe Bool
basepath :: Maybe Text
$sel:body:ReimportApi' :: ReimportApi -> Text
$sel:apiId:ReimportApi' :: ReimportApi -> Text
$sel:failOnWarnings:ReimportApi' :: ReimportApi -> Maybe Bool
$sel:basepath:ReimportApi' :: ReimportApi -> 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 ReimportApi where
  toQuery :: ReimportApi -> QueryString
toQuery ReimportApi' {Maybe Bool
Maybe Text
Text
body :: Text
apiId :: Text
failOnWarnings :: Maybe Bool
basepath :: Maybe Text
$sel:body:ReimportApi' :: ReimportApi -> Text
$sel:apiId:ReimportApi' :: ReimportApi -> Text
$sel:failOnWarnings:ReimportApi' :: ReimportApi -> Maybe Bool
$sel:basepath:ReimportApi' :: ReimportApi -> Maybe Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"basepath" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
basepath,
        ByteString
"failOnWarnings" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Bool
failOnWarnings
      ]

-- | /See:/ 'newReimportApiResponse' smart constructor.
data ReimportApiResponse = ReimportApiResponse'
  { -- | 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.
    ReimportApiResponse -> 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.
    ReimportApiResponse -> Maybe Bool
apiGatewayManaged :: Prelude.Maybe Prelude.Bool,
    -- | The API ID.
    ReimportApiResponse -> 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>.
    ReimportApiResponse -> Maybe Text
apiKeySelectionExpression :: Prelude.Maybe Prelude.Text,
    -- | A CORS configuration. Supported only for HTTP APIs.
    ReimportApiResponse -> Maybe Cors
corsConfiguration :: Prelude.Maybe Cors,
    -- | The timestamp when the API was created.
    ReimportApiResponse -> Maybe ISO8601
createdDate :: Prelude.Maybe Data.ISO8601,
    -- | The description of the API.
    ReimportApiResponse -> 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.
    ReimportApiResponse -> Maybe Bool
disableExecuteApiEndpoint :: Prelude.Maybe Prelude.Bool,
    -- | Avoid validating models when creating a deployment. Supported only for
    -- WebSocket APIs.
    ReimportApiResponse -> 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.
    ReimportApiResponse -> Maybe [Text]
importInfo :: Prelude.Maybe [Prelude.Text],
    -- | The name of the API.
    ReimportApiResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The API protocol.
    ReimportApiResponse -> 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.
    ReimportApiResponse -> Maybe Text
routeSelectionExpression :: Prelude.Maybe Prelude.Text,
    -- | A collection of tags associated with the API.
    ReimportApiResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | A version identifier for the API.
    ReimportApiResponse -> Maybe Text
version :: Prelude.Maybe Prelude.Text,
    -- | The warning messages reported when failonwarnings is turned on during
    -- API import.
    ReimportApiResponse -> Maybe [Text]
warnings :: Prelude.Maybe [Prelude.Text],
    -- | The response's http status code.
    ReimportApiResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (ReimportApiResponse -> ReimportApiResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ReimportApiResponse -> ReimportApiResponse -> Bool
$c/= :: ReimportApiResponse -> ReimportApiResponse -> Bool
== :: ReimportApiResponse -> ReimportApiResponse -> Bool
$c== :: ReimportApiResponse -> ReimportApiResponse -> Bool
Prelude.Eq, ReadPrec [ReimportApiResponse]
ReadPrec ReimportApiResponse
Int -> ReadS ReimportApiResponse
ReadS [ReimportApiResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ReimportApiResponse]
$creadListPrec :: ReadPrec [ReimportApiResponse]
readPrec :: ReadPrec ReimportApiResponse
$creadPrec :: ReadPrec ReimportApiResponse
readList :: ReadS [ReimportApiResponse]
$creadList :: ReadS [ReimportApiResponse]
readsPrec :: Int -> ReadS ReimportApiResponse
$creadsPrec :: Int -> ReadS ReimportApiResponse
Prelude.Read, Int -> ReimportApiResponse -> ShowS
[ReimportApiResponse] -> ShowS
ReimportApiResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ReimportApiResponse] -> ShowS
$cshowList :: [ReimportApiResponse] -> ShowS
show :: ReimportApiResponse -> String
$cshow :: ReimportApiResponse -> String
showsPrec :: Int -> ReimportApiResponse -> ShowS
$cshowsPrec :: Int -> ReimportApiResponse -> ShowS
Prelude.Show, forall x. Rep ReimportApiResponse x -> ReimportApiResponse
forall x. ReimportApiResponse -> Rep ReimportApiResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ReimportApiResponse x -> ReimportApiResponse
$cfrom :: forall x. ReimportApiResponse -> Rep ReimportApiResponse x
Prelude.Generic)

-- |
-- Create a value of 'ReimportApiResponse' 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', 'reimportApiResponse_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', 'reimportApiResponse_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', 'reimportApiResponse_apiId' - The API ID.
--
-- 'apiKeySelectionExpression', 'reimportApiResponse_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', 'reimportApiResponse_corsConfiguration' - A CORS configuration. Supported only for HTTP APIs.
--
-- 'createdDate', 'reimportApiResponse_createdDate' - The timestamp when the API was created.
--
-- 'description', 'reimportApiResponse_description' - The description of the API.
--
-- 'disableExecuteApiEndpoint', 'reimportApiResponse_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', 'reimportApiResponse_disableSchemaValidation' - Avoid validating models when creating a deployment. Supported only for
-- WebSocket APIs.
--
-- 'importInfo', 'reimportApiResponse_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', 'reimportApiResponse_name' - The name of the API.
--
-- 'protocolType', 'reimportApiResponse_protocolType' - The API protocol.
--
-- 'routeSelectionExpression', 'reimportApiResponse_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', 'reimportApiResponse_tags' - A collection of tags associated with the API.
--
-- 'version', 'reimportApiResponse_version' - A version identifier for the API.
--
-- 'warnings', 'reimportApiResponse_warnings' - The warning messages reported when failonwarnings is turned on during
-- API import.
--
-- 'httpStatus', 'reimportApiResponse_httpStatus' - The response's http status code.
newReimportApiResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ReimportApiResponse
newReimportApiResponse :: Int -> ReimportApiResponse
newReimportApiResponse Int
pHttpStatus_ =
  ReimportApiResponse'
    { $sel:apiEndpoint:ReimportApiResponse' :: Maybe Text
apiEndpoint = forall a. Maybe a
Prelude.Nothing,
      $sel:apiGatewayManaged:ReimportApiResponse' :: Maybe Bool
apiGatewayManaged = forall a. Maybe a
Prelude.Nothing,
      $sel:apiId:ReimportApiResponse' :: Maybe Text
apiId = forall a. Maybe a
Prelude.Nothing,
      $sel:apiKeySelectionExpression:ReimportApiResponse' :: Maybe Text
apiKeySelectionExpression = forall a. Maybe a
Prelude.Nothing,
      $sel:corsConfiguration:ReimportApiResponse' :: Maybe Cors
corsConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:createdDate:ReimportApiResponse' :: Maybe ISO8601
createdDate = forall a. Maybe a
Prelude.Nothing,
      $sel:description:ReimportApiResponse' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:disableExecuteApiEndpoint:ReimportApiResponse' :: Maybe Bool
disableExecuteApiEndpoint = forall a. Maybe a
Prelude.Nothing,
      $sel:disableSchemaValidation:ReimportApiResponse' :: Maybe Bool
disableSchemaValidation = forall a. Maybe a
Prelude.Nothing,
      $sel:importInfo:ReimportApiResponse' :: Maybe [Text]
importInfo = forall a. Maybe a
Prelude.Nothing,
      $sel:name:ReimportApiResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:protocolType:ReimportApiResponse' :: Maybe ProtocolType
protocolType = forall a. Maybe a
Prelude.Nothing,
      $sel:routeSelectionExpression:ReimportApiResponse' :: Maybe Text
routeSelectionExpression = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:ReimportApiResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:version:ReimportApiResponse' :: Maybe Text
version = forall a. Maybe a
Prelude.Nothing,
      $sel:warnings:ReimportApiResponse' :: Maybe [Text]
warnings = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:ReimportApiResponse' :: 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.
reimportApiResponse_apiEndpoint :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.Text)
reimportApiResponse_apiEndpoint :: Lens' ReimportApiResponse (Maybe Text)
reimportApiResponse_apiEndpoint = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe Text
apiEndpoint :: Maybe Text
$sel:apiEndpoint:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
apiEndpoint} -> Maybe Text
apiEndpoint) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe Text
a -> ReimportApiResponse
s {$sel:apiEndpoint:ReimportApiResponse' :: Maybe Text
apiEndpoint = Maybe Text
a} :: ReimportApiResponse)

-- | 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.
reimportApiResponse_apiGatewayManaged :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.Bool)
reimportApiResponse_apiGatewayManaged :: Lens' ReimportApiResponse (Maybe Bool)
reimportApiResponse_apiGatewayManaged = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe Bool
apiGatewayManaged :: Maybe Bool
$sel:apiGatewayManaged:ReimportApiResponse' :: ReimportApiResponse -> Maybe Bool
apiGatewayManaged} -> Maybe Bool
apiGatewayManaged) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe Bool
a -> ReimportApiResponse
s {$sel:apiGatewayManaged:ReimportApiResponse' :: Maybe Bool
apiGatewayManaged = Maybe Bool
a} :: ReimportApiResponse)

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

-- | 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>.
reimportApiResponse_apiKeySelectionExpression :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.Text)
reimportApiResponse_apiKeySelectionExpression :: Lens' ReimportApiResponse (Maybe Text)
reimportApiResponse_apiKeySelectionExpression = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe Text
apiKeySelectionExpression :: Maybe Text
$sel:apiKeySelectionExpression:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
apiKeySelectionExpression} -> Maybe Text
apiKeySelectionExpression) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe Text
a -> ReimportApiResponse
s {$sel:apiKeySelectionExpression:ReimportApiResponse' :: Maybe Text
apiKeySelectionExpression = Maybe Text
a} :: ReimportApiResponse)

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

-- | The timestamp when the API was created.
reimportApiResponse_createdDate :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.UTCTime)
reimportApiResponse_createdDate :: Lens' ReimportApiResponse (Maybe UTCTime)
reimportApiResponse_createdDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe ISO8601
createdDate :: Maybe ISO8601
$sel:createdDate:ReimportApiResponse' :: ReimportApiResponse -> Maybe ISO8601
createdDate} -> Maybe ISO8601
createdDate) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe ISO8601
a -> ReimportApiResponse
s {$sel:createdDate:ReimportApiResponse' :: Maybe ISO8601
createdDate = Maybe ISO8601
a} :: ReimportApiResponse) 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.
reimportApiResponse_description :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.Text)
reimportApiResponse_description :: Lens' ReimportApiResponse (Maybe Text)
reimportApiResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe Text
description :: Maybe Text
$sel:description:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe Text
a -> ReimportApiResponse
s {$sel:description:ReimportApiResponse' :: Maybe Text
description = Maybe Text
a} :: ReimportApiResponse)

-- | 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.
reimportApiResponse_disableExecuteApiEndpoint :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.Bool)
reimportApiResponse_disableExecuteApiEndpoint :: Lens' ReimportApiResponse (Maybe Bool)
reimportApiResponse_disableExecuteApiEndpoint = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe Bool
disableExecuteApiEndpoint :: Maybe Bool
$sel:disableExecuteApiEndpoint:ReimportApiResponse' :: ReimportApiResponse -> Maybe Bool
disableExecuteApiEndpoint} -> Maybe Bool
disableExecuteApiEndpoint) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe Bool
a -> ReimportApiResponse
s {$sel:disableExecuteApiEndpoint:ReimportApiResponse' :: Maybe Bool
disableExecuteApiEndpoint = Maybe Bool
a} :: ReimportApiResponse)

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

-- | 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.
reimportApiResponse_importInfo :: Lens.Lens' ReimportApiResponse (Prelude.Maybe [Prelude.Text])
reimportApiResponse_importInfo :: Lens' ReimportApiResponse (Maybe [Text])
reimportApiResponse_importInfo = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe [Text]
importInfo :: Maybe [Text]
$sel:importInfo:ReimportApiResponse' :: ReimportApiResponse -> Maybe [Text]
importInfo} -> Maybe [Text]
importInfo) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe [Text]
a -> ReimportApiResponse
s {$sel:importInfo:ReimportApiResponse' :: Maybe [Text]
importInfo = Maybe [Text]
a} :: ReimportApiResponse) 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.
reimportApiResponse_name :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.Text)
reimportApiResponse_name :: Lens' ReimportApiResponse (Maybe Text)
reimportApiResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe Text
name :: Maybe Text
$sel:name:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe Text
a -> ReimportApiResponse
s {$sel:name:ReimportApiResponse' :: Maybe Text
name = Maybe Text
a} :: ReimportApiResponse)

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

-- | 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.
reimportApiResponse_routeSelectionExpression :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.Text)
reimportApiResponse_routeSelectionExpression :: Lens' ReimportApiResponse (Maybe Text)
reimportApiResponse_routeSelectionExpression = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe Text
routeSelectionExpression :: Maybe Text
$sel:routeSelectionExpression:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
routeSelectionExpression} -> Maybe Text
routeSelectionExpression) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe Text
a -> ReimportApiResponse
s {$sel:routeSelectionExpression:ReimportApiResponse' :: Maybe Text
routeSelectionExpression = Maybe Text
a} :: ReimportApiResponse)

-- | A collection of tags associated with the API.
reimportApiResponse_tags :: Lens.Lens' ReimportApiResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
reimportApiResponse_tags :: Lens' ReimportApiResponse (Maybe (HashMap Text Text))
reimportApiResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:ReimportApiResponse' :: ReimportApiResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe (HashMap Text Text)
a -> ReimportApiResponse
s {$sel:tags:ReimportApiResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: ReimportApiResponse) 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.
reimportApiResponse_version :: Lens.Lens' ReimportApiResponse (Prelude.Maybe Prelude.Text)
reimportApiResponse_version :: Lens' ReimportApiResponse (Maybe Text)
reimportApiResponse_version = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe Text
version :: Maybe Text
$sel:version:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
version} -> Maybe Text
version) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe Text
a -> ReimportApiResponse
s {$sel:version:ReimportApiResponse' :: Maybe Text
version = Maybe Text
a} :: ReimportApiResponse)

-- | The warning messages reported when failonwarnings is turned on during
-- API import.
reimportApiResponse_warnings :: Lens.Lens' ReimportApiResponse (Prelude.Maybe [Prelude.Text])
reimportApiResponse_warnings :: Lens' ReimportApiResponse (Maybe [Text])
reimportApiResponse_warnings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Maybe [Text]
warnings :: Maybe [Text]
$sel:warnings:ReimportApiResponse' :: ReimportApiResponse -> Maybe [Text]
warnings} -> Maybe [Text]
warnings) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Maybe [Text]
a -> ReimportApiResponse
s {$sel:warnings:ReimportApiResponse' :: Maybe [Text]
warnings = Maybe [Text]
a} :: ReimportApiResponse) 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.
reimportApiResponse_httpStatus :: Lens.Lens' ReimportApiResponse Prelude.Int
reimportApiResponse_httpStatus :: Lens' ReimportApiResponse Int
reimportApiResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ReimportApiResponse' {Int
httpStatus :: Int
$sel:httpStatus:ReimportApiResponse' :: ReimportApiResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: ReimportApiResponse
s@ReimportApiResponse' {} Int
a -> ReimportApiResponse
s {$sel:httpStatus:ReimportApiResponse' :: Int
httpStatus = Int
a} :: ReimportApiResponse)

instance Prelude.NFData ReimportApiResponse where
  rnf :: ReimportApiResponse -> ()
rnf ReimportApiResponse' {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:ReimportApiResponse' :: ReimportApiResponse -> Int
$sel:warnings:ReimportApiResponse' :: ReimportApiResponse -> Maybe [Text]
$sel:version:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
$sel:tags:ReimportApiResponse' :: ReimportApiResponse -> Maybe (HashMap Text Text)
$sel:routeSelectionExpression:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
$sel:protocolType:ReimportApiResponse' :: ReimportApiResponse -> Maybe ProtocolType
$sel:name:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
$sel:importInfo:ReimportApiResponse' :: ReimportApiResponse -> Maybe [Text]
$sel:disableSchemaValidation:ReimportApiResponse' :: ReimportApiResponse -> Maybe Bool
$sel:disableExecuteApiEndpoint:ReimportApiResponse' :: ReimportApiResponse -> Maybe Bool
$sel:description:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
$sel:createdDate:ReimportApiResponse' :: ReimportApiResponse -> Maybe ISO8601
$sel:corsConfiguration:ReimportApiResponse' :: ReimportApiResponse -> Maybe Cors
$sel:apiKeySelectionExpression:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
$sel:apiId:ReimportApiResponse' :: ReimportApiResponse -> Maybe Text
$sel:apiGatewayManaged:ReimportApiResponse' :: ReimportApiResponse -> Maybe Bool
$sel:apiEndpoint:ReimportApiResponse' :: ReimportApiResponse -> 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