{-# 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.MediaPackage.RotateIngestEndpointCredentials
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Rotate the IngestEndpoint\'s username and password, as specified by the
-- IngestEndpoint\'s id.
module Amazonka.MediaPackage.RotateIngestEndpointCredentials
  ( -- * Creating a Request
    RotateIngestEndpointCredentials (..),
    newRotateIngestEndpointCredentials,

    -- * Request Lenses
    rotateIngestEndpointCredentials_ingestEndpointId,
    rotateIngestEndpointCredentials_id,

    -- * Destructuring the Response
    RotateIngestEndpointCredentialsResponse (..),
    newRotateIngestEndpointCredentialsResponse,

    -- * Response Lenses
    rotateIngestEndpointCredentialsResponse_arn,
    rotateIngestEndpointCredentialsResponse_description,
    rotateIngestEndpointCredentialsResponse_egressAccessLogs,
    rotateIngestEndpointCredentialsResponse_hlsIngest,
    rotateIngestEndpointCredentialsResponse_id,
    rotateIngestEndpointCredentialsResponse_ingressAccessLogs,
    rotateIngestEndpointCredentialsResponse_tags,
    rotateIngestEndpointCredentialsResponse_httpStatus,
  )
where

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

-- | /See:/ 'newRotateIngestEndpointCredentials' smart constructor.
data RotateIngestEndpointCredentials = RotateIngestEndpointCredentials'
  { -- | The id of the IngestEndpoint whose credentials should be rotated
    RotateIngestEndpointCredentials -> Text
ingestEndpointId :: Prelude.Text,
    -- | The ID of the channel the IngestEndpoint is on.
    RotateIngestEndpointCredentials -> Text
id :: Prelude.Text
  }
  deriving (RotateIngestEndpointCredentials
-> RotateIngestEndpointCredentials -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: RotateIngestEndpointCredentials
-> RotateIngestEndpointCredentials -> Bool
$c/= :: RotateIngestEndpointCredentials
-> RotateIngestEndpointCredentials -> Bool
== :: RotateIngestEndpointCredentials
-> RotateIngestEndpointCredentials -> Bool
$c== :: RotateIngestEndpointCredentials
-> RotateIngestEndpointCredentials -> Bool
Prelude.Eq, ReadPrec [RotateIngestEndpointCredentials]
ReadPrec RotateIngestEndpointCredentials
Int -> ReadS RotateIngestEndpointCredentials
ReadS [RotateIngestEndpointCredentials]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [RotateIngestEndpointCredentials]
$creadListPrec :: ReadPrec [RotateIngestEndpointCredentials]
readPrec :: ReadPrec RotateIngestEndpointCredentials
$creadPrec :: ReadPrec RotateIngestEndpointCredentials
readList :: ReadS [RotateIngestEndpointCredentials]
$creadList :: ReadS [RotateIngestEndpointCredentials]
readsPrec :: Int -> ReadS RotateIngestEndpointCredentials
$creadsPrec :: Int -> ReadS RotateIngestEndpointCredentials
Prelude.Read, Int -> RotateIngestEndpointCredentials -> ShowS
[RotateIngestEndpointCredentials] -> ShowS
RotateIngestEndpointCredentials -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [RotateIngestEndpointCredentials] -> ShowS
$cshowList :: [RotateIngestEndpointCredentials] -> ShowS
show :: RotateIngestEndpointCredentials -> String
$cshow :: RotateIngestEndpointCredentials -> String
showsPrec :: Int -> RotateIngestEndpointCredentials -> ShowS
$cshowsPrec :: Int -> RotateIngestEndpointCredentials -> ShowS
Prelude.Show, forall x.
Rep RotateIngestEndpointCredentials x
-> RotateIngestEndpointCredentials
forall x.
RotateIngestEndpointCredentials
-> Rep RotateIngestEndpointCredentials x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep RotateIngestEndpointCredentials x
-> RotateIngestEndpointCredentials
$cfrom :: forall x.
RotateIngestEndpointCredentials
-> Rep RotateIngestEndpointCredentials x
Prelude.Generic)

-- |
-- Create a value of 'RotateIngestEndpointCredentials' 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:
--
-- 'ingestEndpointId', 'rotateIngestEndpointCredentials_ingestEndpointId' - The id of the IngestEndpoint whose credentials should be rotated
--
-- 'id', 'rotateIngestEndpointCredentials_id' - The ID of the channel the IngestEndpoint is on.
newRotateIngestEndpointCredentials ::
  -- | 'ingestEndpointId'
  Prelude.Text ->
  -- | 'id'
  Prelude.Text ->
  RotateIngestEndpointCredentials
newRotateIngestEndpointCredentials :: Text -> Text -> RotateIngestEndpointCredentials
newRotateIngestEndpointCredentials
  Text
pIngestEndpointId_
  Text
pId_ =
    RotateIngestEndpointCredentials'
      { $sel:ingestEndpointId:RotateIngestEndpointCredentials' :: Text
ingestEndpointId =
          Text
pIngestEndpointId_,
        $sel:id:RotateIngestEndpointCredentials' :: Text
id = Text
pId_
      }

-- | The id of the IngestEndpoint whose credentials should be rotated
rotateIngestEndpointCredentials_ingestEndpointId :: Lens.Lens' RotateIngestEndpointCredentials Prelude.Text
rotateIngestEndpointCredentials_ingestEndpointId :: Lens' RotateIngestEndpointCredentials Text
rotateIngestEndpointCredentials_ingestEndpointId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentials' {Text
ingestEndpointId :: Text
$sel:ingestEndpointId:RotateIngestEndpointCredentials' :: RotateIngestEndpointCredentials -> Text
ingestEndpointId} -> Text
ingestEndpointId) (\s :: RotateIngestEndpointCredentials
s@RotateIngestEndpointCredentials' {} Text
a -> RotateIngestEndpointCredentials
s {$sel:ingestEndpointId:RotateIngestEndpointCredentials' :: Text
ingestEndpointId = Text
a} :: RotateIngestEndpointCredentials)

-- | The ID of the channel the IngestEndpoint is on.
rotateIngestEndpointCredentials_id :: Lens.Lens' RotateIngestEndpointCredentials Prelude.Text
rotateIngestEndpointCredentials_id :: Lens' RotateIngestEndpointCredentials Text
rotateIngestEndpointCredentials_id = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentials' {Text
id :: Text
$sel:id:RotateIngestEndpointCredentials' :: RotateIngestEndpointCredentials -> Text
id} -> Text
id) (\s :: RotateIngestEndpointCredentials
s@RotateIngestEndpointCredentials' {} Text
a -> RotateIngestEndpointCredentials
s {$sel:id:RotateIngestEndpointCredentials' :: Text
id = Text
a} :: RotateIngestEndpointCredentials)

instance
  Core.AWSRequest
    RotateIngestEndpointCredentials
  where
  type
    AWSResponse RotateIngestEndpointCredentials =
      RotateIngestEndpointCredentialsResponse
  request :: (Service -> Service)
-> RotateIngestEndpointCredentials
-> Request RotateIngestEndpointCredentials
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 RotateIngestEndpointCredentials
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse (AWSResponse RotateIngestEndpointCredentials)))
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 EgressAccessLogs
-> Maybe HlsIngest
-> Maybe Text
-> Maybe IngressAccessLogs
-> Maybe (HashMap Text Text)
-> Int
-> RotateIngestEndpointCredentialsResponse
RotateIngestEndpointCredentialsResponse'
            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
"egressAccessLogs")
            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
"hlsIngest")
            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
"ingressAccessLogs")
            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
    RotateIngestEndpointCredentials
  where
  hashWithSalt :: Int -> RotateIngestEndpointCredentials -> Int
hashWithSalt
    Int
_salt
    RotateIngestEndpointCredentials' {Text
id :: Text
ingestEndpointId :: Text
$sel:id:RotateIngestEndpointCredentials' :: RotateIngestEndpointCredentials -> Text
$sel:ingestEndpointId:RotateIngestEndpointCredentials' :: RotateIngestEndpointCredentials -> Text
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
ingestEndpointId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
id

instance
  Prelude.NFData
    RotateIngestEndpointCredentials
  where
  rnf :: RotateIngestEndpointCredentials -> ()
rnf RotateIngestEndpointCredentials' {Text
id :: Text
ingestEndpointId :: Text
$sel:id:RotateIngestEndpointCredentials' :: RotateIngestEndpointCredentials -> Text
$sel:ingestEndpointId:RotateIngestEndpointCredentials' :: RotateIngestEndpointCredentials -> Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Text
ingestEndpointId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
id

instance
  Data.ToHeaders
    RotateIngestEndpointCredentials
  where
  toHeaders :: RotateIngestEndpointCredentials -> 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 RotateIngestEndpointCredentials where
  toJSON :: RotateIngestEndpointCredentials -> Value
toJSON = forall a b. a -> b -> a
Prelude.const (Object -> Value
Data.Object forall a. Monoid a => a
Prelude.mempty)

instance Data.ToPath RotateIngestEndpointCredentials where
  toPath :: RotateIngestEndpointCredentials -> ByteString
toPath RotateIngestEndpointCredentials' {Text
id :: Text
ingestEndpointId :: Text
$sel:id:RotateIngestEndpointCredentials' :: RotateIngestEndpointCredentials -> Text
$sel:ingestEndpointId:RotateIngestEndpointCredentials' :: RotateIngestEndpointCredentials -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/channels/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
id,
        ByteString
"/ingest_endpoints/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
ingestEndpointId,
        ByteString
"/credentials"
      ]

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

-- | /See:/ 'newRotateIngestEndpointCredentialsResponse' smart constructor.
data RotateIngestEndpointCredentialsResponse = RotateIngestEndpointCredentialsResponse'
  { -- | The Amazon Resource Name (ARN) assigned to the Channel.
    RotateIngestEndpointCredentialsResponse -> Maybe Text
arn :: Prelude.Maybe Prelude.Text,
    -- | A short text description of the Channel.
    RotateIngestEndpointCredentialsResponse -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    RotateIngestEndpointCredentialsResponse -> Maybe EgressAccessLogs
egressAccessLogs :: Prelude.Maybe EgressAccessLogs,
    RotateIngestEndpointCredentialsResponse -> Maybe HlsIngest
hlsIngest :: Prelude.Maybe HlsIngest,
    -- | The ID of the Channel.
    RotateIngestEndpointCredentialsResponse -> Maybe Text
id :: Prelude.Maybe Prelude.Text,
    RotateIngestEndpointCredentialsResponse -> Maybe IngressAccessLogs
ingressAccessLogs :: Prelude.Maybe IngressAccessLogs,
    RotateIngestEndpointCredentialsResponse
-> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The response's http status code.
    RotateIngestEndpointCredentialsResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (RotateIngestEndpointCredentialsResponse
-> RotateIngestEndpointCredentialsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: RotateIngestEndpointCredentialsResponse
-> RotateIngestEndpointCredentialsResponse -> Bool
$c/= :: RotateIngestEndpointCredentialsResponse
-> RotateIngestEndpointCredentialsResponse -> Bool
== :: RotateIngestEndpointCredentialsResponse
-> RotateIngestEndpointCredentialsResponse -> Bool
$c== :: RotateIngestEndpointCredentialsResponse
-> RotateIngestEndpointCredentialsResponse -> Bool
Prelude.Eq, ReadPrec [RotateIngestEndpointCredentialsResponse]
ReadPrec RotateIngestEndpointCredentialsResponse
Int -> ReadS RotateIngestEndpointCredentialsResponse
ReadS [RotateIngestEndpointCredentialsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [RotateIngestEndpointCredentialsResponse]
$creadListPrec :: ReadPrec [RotateIngestEndpointCredentialsResponse]
readPrec :: ReadPrec RotateIngestEndpointCredentialsResponse
$creadPrec :: ReadPrec RotateIngestEndpointCredentialsResponse
readList :: ReadS [RotateIngestEndpointCredentialsResponse]
$creadList :: ReadS [RotateIngestEndpointCredentialsResponse]
readsPrec :: Int -> ReadS RotateIngestEndpointCredentialsResponse
$creadsPrec :: Int -> ReadS RotateIngestEndpointCredentialsResponse
Prelude.Read, Int -> RotateIngestEndpointCredentialsResponse -> ShowS
[RotateIngestEndpointCredentialsResponse] -> ShowS
RotateIngestEndpointCredentialsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [RotateIngestEndpointCredentialsResponse] -> ShowS
$cshowList :: [RotateIngestEndpointCredentialsResponse] -> ShowS
show :: RotateIngestEndpointCredentialsResponse -> String
$cshow :: RotateIngestEndpointCredentialsResponse -> String
showsPrec :: Int -> RotateIngestEndpointCredentialsResponse -> ShowS
$cshowsPrec :: Int -> RotateIngestEndpointCredentialsResponse -> ShowS
Prelude.Show, forall x.
Rep RotateIngestEndpointCredentialsResponse x
-> RotateIngestEndpointCredentialsResponse
forall x.
RotateIngestEndpointCredentialsResponse
-> Rep RotateIngestEndpointCredentialsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep RotateIngestEndpointCredentialsResponse x
-> RotateIngestEndpointCredentialsResponse
$cfrom :: forall x.
RotateIngestEndpointCredentialsResponse
-> Rep RotateIngestEndpointCredentialsResponse x
Prelude.Generic)

-- |
-- Create a value of 'RotateIngestEndpointCredentialsResponse' 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', 'rotateIngestEndpointCredentialsResponse_arn' - The Amazon Resource Name (ARN) assigned to the Channel.
--
-- 'description', 'rotateIngestEndpointCredentialsResponse_description' - A short text description of the Channel.
--
-- 'egressAccessLogs', 'rotateIngestEndpointCredentialsResponse_egressAccessLogs' - Undocumented member.
--
-- 'hlsIngest', 'rotateIngestEndpointCredentialsResponse_hlsIngest' - Undocumented member.
--
-- 'id', 'rotateIngestEndpointCredentialsResponse_id' - The ID of the Channel.
--
-- 'ingressAccessLogs', 'rotateIngestEndpointCredentialsResponse_ingressAccessLogs' - Undocumented member.
--
-- 'tags', 'rotateIngestEndpointCredentialsResponse_tags' - Undocumented member.
--
-- 'httpStatus', 'rotateIngestEndpointCredentialsResponse_httpStatus' - The response's http status code.
newRotateIngestEndpointCredentialsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  RotateIngestEndpointCredentialsResponse
newRotateIngestEndpointCredentialsResponse :: Int -> RotateIngestEndpointCredentialsResponse
newRotateIngestEndpointCredentialsResponse
  Int
pHttpStatus_ =
    RotateIngestEndpointCredentialsResponse'
      { $sel:arn:RotateIngestEndpointCredentialsResponse' :: Maybe Text
arn =
          forall a. Maybe a
Prelude.Nothing,
        $sel:description:RotateIngestEndpointCredentialsResponse' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
        $sel:egressAccessLogs:RotateIngestEndpointCredentialsResponse' :: Maybe EgressAccessLogs
egressAccessLogs = forall a. Maybe a
Prelude.Nothing,
        $sel:hlsIngest:RotateIngestEndpointCredentialsResponse' :: Maybe HlsIngest
hlsIngest = forall a. Maybe a
Prelude.Nothing,
        $sel:id:RotateIngestEndpointCredentialsResponse' :: Maybe Text
id = forall a. Maybe a
Prelude.Nothing,
        $sel:ingressAccessLogs:RotateIngestEndpointCredentialsResponse' :: Maybe IngressAccessLogs
ingressAccessLogs =
          forall a. Maybe a
Prelude.Nothing,
        $sel:tags:RotateIngestEndpointCredentialsResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:RotateIngestEndpointCredentialsResponse' :: Int
httpStatus = Int
pHttpStatus_
      }

-- | The Amazon Resource Name (ARN) assigned to the Channel.
rotateIngestEndpointCredentialsResponse_arn :: Lens.Lens' RotateIngestEndpointCredentialsResponse (Prelude.Maybe Prelude.Text)
rotateIngestEndpointCredentialsResponse_arn :: Lens' RotateIngestEndpointCredentialsResponse (Maybe Text)
rotateIngestEndpointCredentialsResponse_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentialsResponse' {Maybe Text
arn :: Maybe Text
$sel:arn:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe Text
arn} -> Maybe Text
arn) (\s :: RotateIngestEndpointCredentialsResponse
s@RotateIngestEndpointCredentialsResponse' {} Maybe Text
a -> RotateIngestEndpointCredentialsResponse
s {$sel:arn:RotateIngestEndpointCredentialsResponse' :: Maybe Text
arn = Maybe Text
a} :: RotateIngestEndpointCredentialsResponse)

-- | A short text description of the Channel.
rotateIngestEndpointCredentialsResponse_description :: Lens.Lens' RotateIngestEndpointCredentialsResponse (Prelude.Maybe Prelude.Text)
rotateIngestEndpointCredentialsResponse_description :: Lens' RotateIngestEndpointCredentialsResponse (Maybe Text)
rotateIngestEndpointCredentialsResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentialsResponse' {Maybe Text
description :: Maybe Text
$sel:description:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: RotateIngestEndpointCredentialsResponse
s@RotateIngestEndpointCredentialsResponse' {} Maybe Text
a -> RotateIngestEndpointCredentialsResponse
s {$sel:description:RotateIngestEndpointCredentialsResponse' :: Maybe Text
description = Maybe Text
a} :: RotateIngestEndpointCredentialsResponse)

-- | Undocumented member.
rotateIngestEndpointCredentialsResponse_egressAccessLogs :: Lens.Lens' RotateIngestEndpointCredentialsResponse (Prelude.Maybe EgressAccessLogs)
rotateIngestEndpointCredentialsResponse_egressAccessLogs :: Lens'
  RotateIngestEndpointCredentialsResponse (Maybe EgressAccessLogs)
rotateIngestEndpointCredentialsResponse_egressAccessLogs = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentialsResponse' {Maybe EgressAccessLogs
egressAccessLogs :: Maybe EgressAccessLogs
$sel:egressAccessLogs:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe EgressAccessLogs
egressAccessLogs} -> Maybe EgressAccessLogs
egressAccessLogs) (\s :: RotateIngestEndpointCredentialsResponse
s@RotateIngestEndpointCredentialsResponse' {} Maybe EgressAccessLogs
a -> RotateIngestEndpointCredentialsResponse
s {$sel:egressAccessLogs:RotateIngestEndpointCredentialsResponse' :: Maybe EgressAccessLogs
egressAccessLogs = Maybe EgressAccessLogs
a} :: RotateIngestEndpointCredentialsResponse)

-- | Undocumented member.
rotateIngestEndpointCredentialsResponse_hlsIngest :: Lens.Lens' RotateIngestEndpointCredentialsResponse (Prelude.Maybe HlsIngest)
rotateIngestEndpointCredentialsResponse_hlsIngest :: Lens' RotateIngestEndpointCredentialsResponse (Maybe HlsIngest)
rotateIngestEndpointCredentialsResponse_hlsIngest = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentialsResponse' {Maybe HlsIngest
hlsIngest :: Maybe HlsIngest
$sel:hlsIngest:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe HlsIngest
hlsIngest} -> Maybe HlsIngest
hlsIngest) (\s :: RotateIngestEndpointCredentialsResponse
s@RotateIngestEndpointCredentialsResponse' {} Maybe HlsIngest
a -> RotateIngestEndpointCredentialsResponse
s {$sel:hlsIngest:RotateIngestEndpointCredentialsResponse' :: Maybe HlsIngest
hlsIngest = Maybe HlsIngest
a} :: RotateIngestEndpointCredentialsResponse)

-- | The ID of the Channel.
rotateIngestEndpointCredentialsResponse_id :: Lens.Lens' RotateIngestEndpointCredentialsResponse (Prelude.Maybe Prelude.Text)
rotateIngestEndpointCredentialsResponse_id :: Lens' RotateIngestEndpointCredentialsResponse (Maybe Text)
rotateIngestEndpointCredentialsResponse_id = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentialsResponse' {Maybe Text
id :: Maybe Text
$sel:id:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe Text
id} -> Maybe Text
id) (\s :: RotateIngestEndpointCredentialsResponse
s@RotateIngestEndpointCredentialsResponse' {} Maybe Text
a -> RotateIngestEndpointCredentialsResponse
s {$sel:id:RotateIngestEndpointCredentialsResponse' :: Maybe Text
id = Maybe Text
a} :: RotateIngestEndpointCredentialsResponse)

-- | Undocumented member.
rotateIngestEndpointCredentialsResponse_ingressAccessLogs :: Lens.Lens' RotateIngestEndpointCredentialsResponse (Prelude.Maybe IngressAccessLogs)
rotateIngestEndpointCredentialsResponse_ingressAccessLogs :: Lens'
  RotateIngestEndpointCredentialsResponse (Maybe IngressAccessLogs)
rotateIngestEndpointCredentialsResponse_ingressAccessLogs = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentialsResponse' {Maybe IngressAccessLogs
ingressAccessLogs :: Maybe IngressAccessLogs
$sel:ingressAccessLogs:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe IngressAccessLogs
ingressAccessLogs} -> Maybe IngressAccessLogs
ingressAccessLogs) (\s :: RotateIngestEndpointCredentialsResponse
s@RotateIngestEndpointCredentialsResponse' {} Maybe IngressAccessLogs
a -> RotateIngestEndpointCredentialsResponse
s {$sel:ingressAccessLogs:RotateIngestEndpointCredentialsResponse' :: Maybe IngressAccessLogs
ingressAccessLogs = Maybe IngressAccessLogs
a} :: RotateIngestEndpointCredentialsResponse)

-- | Undocumented member.
rotateIngestEndpointCredentialsResponse_tags :: Lens.Lens' RotateIngestEndpointCredentialsResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
rotateIngestEndpointCredentialsResponse_tags :: Lens'
  RotateIngestEndpointCredentialsResponse (Maybe (HashMap Text Text))
rotateIngestEndpointCredentialsResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentialsResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse
-> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: RotateIngestEndpointCredentialsResponse
s@RotateIngestEndpointCredentialsResponse' {} Maybe (HashMap Text Text)
a -> RotateIngestEndpointCredentialsResponse
s {$sel:tags:RotateIngestEndpointCredentialsResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: RotateIngestEndpointCredentialsResponse) 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.
rotateIngestEndpointCredentialsResponse_httpStatus :: Lens.Lens' RotateIngestEndpointCredentialsResponse Prelude.Int
rotateIngestEndpointCredentialsResponse_httpStatus :: Lens' RotateIngestEndpointCredentialsResponse Int
rotateIngestEndpointCredentialsResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RotateIngestEndpointCredentialsResponse' {Int
httpStatus :: Int
$sel:httpStatus:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: RotateIngestEndpointCredentialsResponse
s@RotateIngestEndpointCredentialsResponse' {} Int
a -> RotateIngestEndpointCredentialsResponse
s {$sel:httpStatus:RotateIngestEndpointCredentialsResponse' :: Int
httpStatus = Int
a} :: RotateIngestEndpointCredentialsResponse)

instance
  Prelude.NFData
    RotateIngestEndpointCredentialsResponse
  where
  rnf :: RotateIngestEndpointCredentialsResponse -> ()
rnf RotateIngestEndpointCredentialsResponse' {Int
Maybe Text
Maybe (HashMap Text Text)
Maybe EgressAccessLogs
Maybe HlsIngest
Maybe IngressAccessLogs
httpStatus :: Int
tags :: Maybe (HashMap Text Text)
ingressAccessLogs :: Maybe IngressAccessLogs
id :: Maybe Text
hlsIngest :: Maybe HlsIngest
egressAccessLogs :: Maybe EgressAccessLogs
description :: Maybe Text
arn :: Maybe Text
$sel:httpStatus:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Int
$sel:tags:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse
-> Maybe (HashMap Text Text)
$sel:ingressAccessLogs:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe IngressAccessLogs
$sel:id:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe Text
$sel:hlsIngest:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe HlsIngest
$sel:egressAccessLogs:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe EgressAccessLogs
$sel:description:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> Maybe Text
$sel:arn:RotateIngestEndpointCredentialsResponse' :: RotateIngestEndpointCredentialsResponse -> 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 EgressAccessLogs
egressAccessLogs
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe HlsIngest
hlsIngest
      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 IngressAccessLogs
ingressAccessLogs
      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