{-# 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.AppIntegrationS.GetDataIntegration
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Returns information about the DataIntegration.
--
-- You cannot create a DataIntegration association for a DataIntegration
-- that has been previously associated. Use a different DataIntegration, or
-- recreate the DataIntegration using the
-- <https://docs.aws.amazon.com/appintegrations/latest/APIReference/API_CreateDataIntegration.html CreateDataIntegration>
-- API.
module Amazonka.AppIntegrationS.GetDataIntegration
  ( -- * Creating a Request
    GetDataIntegration (..),
    newGetDataIntegration,

    -- * Request Lenses
    getDataIntegration_identifier,

    -- * Destructuring the Response
    GetDataIntegrationResponse (..),
    newGetDataIntegrationResponse,

    -- * Response Lenses
    getDataIntegrationResponse_arn,
    getDataIntegrationResponse_description,
    getDataIntegrationResponse_id,
    getDataIntegrationResponse_kmsKey,
    getDataIntegrationResponse_name,
    getDataIntegrationResponse_scheduleConfiguration,
    getDataIntegrationResponse_sourceURI,
    getDataIntegrationResponse_tags,
    getDataIntegrationResponse_httpStatus,
  )
where

import Amazonka.AppIntegrationS.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:/ 'newGetDataIntegration' smart constructor.
data GetDataIntegration = GetDataIntegration'
  { -- | A unique identifier.
    GetDataIntegration -> Text
identifier :: Prelude.Text
  }
  deriving (GetDataIntegration -> GetDataIntegration -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetDataIntegration -> GetDataIntegration -> Bool
$c/= :: GetDataIntegration -> GetDataIntegration -> Bool
== :: GetDataIntegration -> GetDataIntegration -> Bool
$c== :: GetDataIntegration -> GetDataIntegration -> Bool
Prelude.Eq, ReadPrec [GetDataIntegration]
ReadPrec GetDataIntegration
Int -> ReadS GetDataIntegration
ReadS [GetDataIntegration]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetDataIntegration]
$creadListPrec :: ReadPrec [GetDataIntegration]
readPrec :: ReadPrec GetDataIntegration
$creadPrec :: ReadPrec GetDataIntegration
readList :: ReadS [GetDataIntegration]
$creadList :: ReadS [GetDataIntegration]
readsPrec :: Int -> ReadS GetDataIntegration
$creadsPrec :: Int -> ReadS GetDataIntegration
Prelude.Read, Int -> GetDataIntegration -> ShowS
[GetDataIntegration] -> ShowS
GetDataIntegration -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetDataIntegration] -> ShowS
$cshowList :: [GetDataIntegration] -> ShowS
show :: GetDataIntegration -> String
$cshow :: GetDataIntegration -> String
showsPrec :: Int -> GetDataIntegration -> ShowS
$cshowsPrec :: Int -> GetDataIntegration -> ShowS
Prelude.Show, forall x. Rep GetDataIntegration x -> GetDataIntegration
forall x. GetDataIntegration -> Rep GetDataIntegration x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetDataIntegration x -> GetDataIntegration
$cfrom :: forall x. GetDataIntegration -> Rep GetDataIntegration x
Prelude.Generic)

-- |
-- Create a value of 'GetDataIntegration' 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:
--
-- 'identifier', 'getDataIntegration_identifier' - A unique identifier.
newGetDataIntegration ::
  -- | 'identifier'
  Prelude.Text ->
  GetDataIntegration
newGetDataIntegration :: Text -> GetDataIntegration
newGetDataIntegration Text
pIdentifier_ =
  GetDataIntegration' {$sel:identifier:GetDataIntegration' :: Text
identifier = Text
pIdentifier_}

-- | A unique identifier.
getDataIntegration_identifier :: Lens.Lens' GetDataIntegration Prelude.Text
getDataIntegration_identifier :: Lens' GetDataIntegration Text
getDataIntegration_identifier = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegration' {Text
identifier :: Text
$sel:identifier:GetDataIntegration' :: GetDataIntegration -> Text
identifier} -> Text
identifier) (\s :: GetDataIntegration
s@GetDataIntegration' {} Text
a -> GetDataIntegration
s {$sel:identifier:GetDataIntegration' :: Text
identifier = Text
a} :: GetDataIntegration)

instance Core.AWSRequest GetDataIntegration where
  type
    AWSResponse GetDataIntegration =
      GetDataIntegrationResponse
  request :: (Service -> Service)
-> GetDataIntegration -> Request GetDataIntegration
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.get (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy GetDataIntegration
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse GetDataIntegration)))
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 Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe ScheduleConfiguration
-> Maybe Text
-> Maybe (HashMap Text Text)
-> Int
-> GetDataIntegrationResponse
GetDataIntegrationResponse'
            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
"Arn")
            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
"Id")
            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
"KmsKey")
            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
"ScheduleConfiguration")
            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
"SourceURI")
            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.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable GetDataIntegration where
  hashWithSalt :: Int -> GetDataIntegration -> Int
hashWithSalt Int
_salt GetDataIntegration' {Text
identifier :: Text
$sel:identifier:GetDataIntegration' :: GetDataIntegration -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
identifier

instance Prelude.NFData GetDataIntegration where
  rnf :: GetDataIntegration -> ()
rnf GetDataIntegration' {Text
identifier :: Text
$sel:identifier:GetDataIntegration' :: GetDataIntegration -> Text
..} = forall a. NFData a => a -> ()
Prelude.rnf Text
identifier

instance Data.ToHeaders GetDataIntegration where
  toHeaders :: GetDataIntegration -> 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.ToPath GetDataIntegration where
  toPath :: GetDataIntegration -> ByteString
toPath GetDataIntegration' {Text
identifier :: Text
$sel:identifier:GetDataIntegration' :: GetDataIntegration -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ByteString
"/dataIntegrations/", forall a. ToByteString a => a -> ByteString
Data.toBS Text
identifier]

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

-- | /See:/ 'newGetDataIntegrationResponse' smart constructor.
data GetDataIntegrationResponse = GetDataIntegrationResponse'
  { -- | The Amazon Resource Name (ARN) for the DataIntegration.
    GetDataIntegrationResponse -> Maybe Text
arn :: Prelude.Maybe Prelude.Text,
    -- | The KMS key for the DataIntegration.
    GetDataIntegrationResponse -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | A unique identifier.
    GetDataIntegrationResponse -> Maybe Text
id :: Prelude.Maybe Prelude.Text,
    -- | The KMS key for the DataIntegration.
    GetDataIntegrationResponse -> Maybe Text
kmsKey :: Prelude.Maybe Prelude.Text,
    -- | The name of the DataIntegration.
    GetDataIntegrationResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The name of the data and how often it should be pulled from the source.
    GetDataIntegrationResponse -> Maybe ScheduleConfiguration
scheduleConfiguration :: Prelude.Maybe ScheduleConfiguration,
    -- | The URI of the data source.
    GetDataIntegrationResponse -> Maybe Text
sourceURI :: Prelude.Maybe Prelude.Text,
    -- | One or more tags.
    GetDataIntegrationResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The response's http status code.
    GetDataIntegrationResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetDataIntegrationResponse -> GetDataIntegrationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetDataIntegrationResponse -> GetDataIntegrationResponse -> Bool
$c/= :: GetDataIntegrationResponse -> GetDataIntegrationResponse -> Bool
== :: GetDataIntegrationResponse -> GetDataIntegrationResponse -> Bool
$c== :: GetDataIntegrationResponse -> GetDataIntegrationResponse -> Bool
Prelude.Eq, ReadPrec [GetDataIntegrationResponse]
ReadPrec GetDataIntegrationResponse
Int -> ReadS GetDataIntegrationResponse
ReadS [GetDataIntegrationResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetDataIntegrationResponse]
$creadListPrec :: ReadPrec [GetDataIntegrationResponse]
readPrec :: ReadPrec GetDataIntegrationResponse
$creadPrec :: ReadPrec GetDataIntegrationResponse
readList :: ReadS [GetDataIntegrationResponse]
$creadList :: ReadS [GetDataIntegrationResponse]
readsPrec :: Int -> ReadS GetDataIntegrationResponse
$creadsPrec :: Int -> ReadS GetDataIntegrationResponse
Prelude.Read, Int -> GetDataIntegrationResponse -> ShowS
[GetDataIntegrationResponse] -> ShowS
GetDataIntegrationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetDataIntegrationResponse] -> ShowS
$cshowList :: [GetDataIntegrationResponse] -> ShowS
show :: GetDataIntegrationResponse -> String
$cshow :: GetDataIntegrationResponse -> String
showsPrec :: Int -> GetDataIntegrationResponse -> ShowS
$cshowsPrec :: Int -> GetDataIntegrationResponse -> ShowS
Prelude.Show, forall x.
Rep GetDataIntegrationResponse x -> GetDataIntegrationResponse
forall x.
GetDataIntegrationResponse -> Rep GetDataIntegrationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetDataIntegrationResponse x -> GetDataIntegrationResponse
$cfrom :: forall x.
GetDataIntegrationResponse -> Rep GetDataIntegrationResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetDataIntegrationResponse' 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:
--
-- 'arn', 'getDataIntegrationResponse_arn' - The Amazon Resource Name (ARN) for the DataIntegration.
--
-- 'description', 'getDataIntegrationResponse_description' - The KMS key for the DataIntegration.
--
-- 'id', 'getDataIntegrationResponse_id' - A unique identifier.
--
-- 'kmsKey', 'getDataIntegrationResponse_kmsKey' - The KMS key for the DataIntegration.
--
-- 'name', 'getDataIntegrationResponse_name' - The name of the DataIntegration.
--
-- 'scheduleConfiguration', 'getDataIntegrationResponse_scheduleConfiguration' - The name of the data and how often it should be pulled from the source.
--
-- 'sourceURI', 'getDataIntegrationResponse_sourceURI' - The URI of the data source.
--
-- 'tags', 'getDataIntegrationResponse_tags' - One or more tags.
--
-- 'httpStatus', 'getDataIntegrationResponse_httpStatus' - The response's http status code.
newGetDataIntegrationResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetDataIntegrationResponse
newGetDataIntegrationResponse :: Int -> GetDataIntegrationResponse
newGetDataIntegrationResponse Int
pHttpStatus_ =
  GetDataIntegrationResponse'
    { $sel:arn:GetDataIntegrationResponse' :: Maybe Text
arn = forall a. Maybe a
Prelude.Nothing,
      $sel:description:GetDataIntegrationResponse' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:id:GetDataIntegrationResponse' :: Maybe Text
id = forall a. Maybe a
Prelude.Nothing,
      $sel:kmsKey:GetDataIntegrationResponse' :: Maybe Text
kmsKey = forall a. Maybe a
Prelude.Nothing,
      $sel:name:GetDataIntegrationResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:scheduleConfiguration:GetDataIntegrationResponse' :: Maybe ScheduleConfiguration
scheduleConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:sourceURI:GetDataIntegrationResponse' :: Maybe Text
sourceURI = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:GetDataIntegrationResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:GetDataIntegrationResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The Amazon Resource Name (ARN) for the DataIntegration.
getDataIntegrationResponse_arn :: Lens.Lens' GetDataIntegrationResponse (Prelude.Maybe Prelude.Text)
getDataIntegrationResponse_arn :: Lens' GetDataIntegrationResponse (Maybe Text)
getDataIntegrationResponse_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegrationResponse' {Maybe Text
arn :: Maybe Text
$sel:arn:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
arn} -> Maybe Text
arn) (\s :: GetDataIntegrationResponse
s@GetDataIntegrationResponse' {} Maybe Text
a -> GetDataIntegrationResponse
s {$sel:arn:GetDataIntegrationResponse' :: Maybe Text
arn = Maybe Text
a} :: GetDataIntegrationResponse)

-- | The KMS key for the DataIntegration.
getDataIntegrationResponse_description :: Lens.Lens' GetDataIntegrationResponse (Prelude.Maybe Prelude.Text)
getDataIntegrationResponse_description :: Lens' GetDataIntegrationResponse (Maybe Text)
getDataIntegrationResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegrationResponse' {Maybe Text
description :: Maybe Text
$sel:description:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: GetDataIntegrationResponse
s@GetDataIntegrationResponse' {} Maybe Text
a -> GetDataIntegrationResponse
s {$sel:description:GetDataIntegrationResponse' :: Maybe Text
description = Maybe Text
a} :: GetDataIntegrationResponse)

-- | A unique identifier.
getDataIntegrationResponse_id :: Lens.Lens' GetDataIntegrationResponse (Prelude.Maybe Prelude.Text)
getDataIntegrationResponse_id :: Lens' GetDataIntegrationResponse (Maybe Text)
getDataIntegrationResponse_id = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegrationResponse' {Maybe Text
id :: Maybe Text
$sel:id:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
id} -> Maybe Text
id) (\s :: GetDataIntegrationResponse
s@GetDataIntegrationResponse' {} Maybe Text
a -> GetDataIntegrationResponse
s {$sel:id:GetDataIntegrationResponse' :: Maybe Text
id = Maybe Text
a} :: GetDataIntegrationResponse)

-- | The KMS key for the DataIntegration.
getDataIntegrationResponse_kmsKey :: Lens.Lens' GetDataIntegrationResponse (Prelude.Maybe Prelude.Text)
getDataIntegrationResponse_kmsKey :: Lens' GetDataIntegrationResponse (Maybe Text)
getDataIntegrationResponse_kmsKey = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegrationResponse' {Maybe Text
kmsKey :: Maybe Text
$sel:kmsKey:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
kmsKey} -> Maybe Text
kmsKey) (\s :: GetDataIntegrationResponse
s@GetDataIntegrationResponse' {} Maybe Text
a -> GetDataIntegrationResponse
s {$sel:kmsKey:GetDataIntegrationResponse' :: Maybe Text
kmsKey = Maybe Text
a} :: GetDataIntegrationResponse)

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

-- | The name of the data and how often it should be pulled from the source.
getDataIntegrationResponse_scheduleConfiguration :: Lens.Lens' GetDataIntegrationResponse (Prelude.Maybe ScheduleConfiguration)
getDataIntegrationResponse_scheduleConfiguration :: Lens' GetDataIntegrationResponse (Maybe ScheduleConfiguration)
getDataIntegrationResponse_scheduleConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegrationResponse' {Maybe ScheduleConfiguration
scheduleConfiguration :: Maybe ScheduleConfiguration
$sel:scheduleConfiguration:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe ScheduleConfiguration
scheduleConfiguration} -> Maybe ScheduleConfiguration
scheduleConfiguration) (\s :: GetDataIntegrationResponse
s@GetDataIntegrationResponse' {} Maybe ScheduleConfiguration
a -> GetDataIntegrationResponse
s {$sel:scheduleConfiguration:GetDataIntegrationResponse' :: Maybe ScheduleConfiguration
scheduleConfiguration = Maybe ScheduleConfiguration
a} :: GetDataIntegrationResponse)

-- | The URI of the data source.
getDataIntegrationResponse_sourceURI :: Lens.Lens' GetDataIntegrationResponse (Prelude.Maybe Prelude.Text)
getDataIntegrationResponse_sourceURI :: Lens' GetDataIntegrationResponse (Maybe Text)
getDataIntegrationResponse_sourceURI = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegrationResponse' {Maybe Text
sourceURI :: Maybe Text
$sel:sourceURI:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
sourceURI} -> Maybe Text
sourceURI) (\s :: GetDataIntegrationResponse
s@GetDataIntegrationResponse' {} Maybe Text
a -> GetDataIntegrationResponse
s {$sel:sourceURI:GetDataIntegrationResponse' :: Maybe Text
sourceURI = Maybe Text
a} :: GetDataIntegrationResponse)

-- | One or more tags.
getDataIntegrationResponse_tags :: Lens.Lens' GetDataIntegrationResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
getDataIntegrationResponse_tags :: Lens' GetDataIntegrationResponse (Maybe (HashMap Text Text))
getDataIntegrationResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegrationResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: GetDataIntegrationResponse
s@GetDataIntegrationResponse' {} Maybe (HashMap Text Text)
a -> GetDataIntegrationResponse
s {$sel:tags:GetDataIntegrationResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: GetDataIntegrationResponse) 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.
getDataIntegrationResponse_httpStatus :: Lens.Lens' GetDataIntegrationResponse Prelude.Int
getDataIntegrationResponse_httpStatus :: Lens' GetDataIntegrationResponse Int
getDataIntegrationResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataIntegrationResponse' {Int
httpStatus :: Int
$sel:httpStatus:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: GetDataIntegrationResponse
s@GetDataIntegrationResponse' {} Int
a -> GetDataIntegrationResponse
s {$sel:httpStatus:GetDataIntegrationResponse' :: Int
httpStatus = Int
a} :: GetDataIntegrationResponse)

instance Prelude.NFData GetDataIntegrationResponse where
  rnf :: GetDataIntegrationResponse -> ()
rnf GetDataIntegrationResponse' {Int
Maybe Text
Maybe (HashMap Text Text)
Maybe ScheduleConfiguration
httpStatus :: Int
tags :: Maybe (HashMap Text Text)
sourceURI :: Maybe Text
scheduleConfiguration :: Maybe ScheduleConfiguration
name :: Maybe Text
kmsKey :: Maybe Text
id :: Maybe Text
description :: Maybe Text
arn :: Maybe Text
$sel:httpStatus:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Int
$sel:tags:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe (HashMap Text Text)
$sel:sourceURI:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
$sel:scheduleConfiguration:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe ScheduleConfiguration
$sel:name:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
$sel:kmsKey:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
$sel:id:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
$sel:description:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
$sel:arn:GetDataIntegrationResponse' :: GetDataIntegrationResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
arn
      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 Text
id
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
kmsKey
      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 ScheduleConfiguration
scheduleConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
sourceURI
      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 Int
httpStatus