{-# 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 #-}
module Amazonka.MediaLive.DescribeChannel
(
DescribeChannel (..),
newDescribeChannel,
describeChannel_channelId,
DescribeChannelResponse (..),
newDescribeChannelResponse,
describeChannelResponse_arn,
describeChannelResponse_cdiInputSpecification,
describeChannelResponse_channelClass,
describeChannelResponse_destinations,
describeChannelResponse_egressEndpoints,
describeChannelResponse_encoderSettings,
describeChannelResponse_id,
describeChannelResponse_inputAttachments,
describeChannelResponse_inputSpecification,
describeChannelResponse_logLevel,
describeChannelResponse_maintenance,
describeChannelResponse_name,
describeChannelResponse_pipelineDetails,
describeChannelResponse_pipelinesRunningCount,
describeChannelResponse_roleArn,
describeChannelResponse_state,
describeChannelResponse_tags,
describeChannelResponse_vpc,
describeChannelResponse_httpStatus,
)
where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.MediaLive.Types
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
data DescribeChannel = DescribeChannel'
{
DescribeChannel -> Text
channelId :: Prelude.Text
}
deriving (DescribeChannel -> DescribeChannel -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeChannel -> DescribeChannel -> Bool
$c/= :: DescribeChannel -> DescribeChannel -> Bool
== :: DescribeChannel -> DescribeChannel -> Bool
$c== :: DescribeChannel -> DescribeChannel -> Bool
Prelude.Eq, ReadPrec [DescribeChannel]
ReadPrec DescribeChannel
Int -> ReadS DescribeChannel
ReadS [DescribeChannel]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeChannel]
$creadListPrec :: ReadPrec [DescribeChannel]
readPrec :: ReadPrec DescribeChannel
$creadPrec :: ReadPrec DescribeChannel
readList :: ReadS [DescribeChannel]
$creadList :: ReadS [DescribeChannel]
readsPrec :: Int -> ReadS DescribeChannel
$creadsPrec :: Int -> ReadS DescribeChannel
Prelude.Read, Int -> DescribeChannel -> ShowS
[DescribeChannel] -> ShowS
DescribeChannel -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeChannel] -> ShowS
$cshowList :: [DescribeChannel] -> ShowS
show :: DescribeChannel -> String
$cshow :: DescribeChannel -> String
showsPrec :: Int -> DescribeChannel -> ShowS
$cshowsPrec :: Int -> DescribeChannel -> ShowS
Prelude.Show, forall x. Rep DescribeChannel x -> DescribeChannel
forall x. DescribeChannel -> Rep DescribeChannel x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeChannel x -> DescribeChannel
$cfrom :: forall x. DescribeChannel -> Rep DescribeChannel x
Prelude.Generic)
newDescribeChannel ::
Prelude.Text ->
DescribeChannel
newDescribeChannel :: Text -> DescribeChannel
newDescribeChannel Text
pChannelId_ =
DescribeChannel' {$sel:channelId:DescribeChannel' :: Text
channelId = Text
pChannelId_}
describeChannel_channelId :: Lens.Lens' DescribeChannel Prelude.Text
describeChannel_channelId :: Lens' DescribeChannel Text
describeChannel_channelId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannel' {Text
channelId :: Text
$sel:channelId:DescribeChannel' :: DescribeChannel -> Text
channelId} -> Text
channelId) (\s :: DescribeChannel
s@DescribeChannel' {} Text
a -> DescribeChannel
s {$sel:channelId:DescribeChannel' :: Text
channelId = Text
a} :: DescribeChannel)
instance Core.AWSRequest DescribeChannel where
type
AWSResponse DescribeChannel =
DescribeChannelResponse
request :: (Service -> Service) -> DescribeChannel -> Request DescribeChannel
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 DescribeChannel
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse DescribeChannel)))
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 CdiInputSpecification
-> Maybe ChannelClass
-> Maybe [OutputDestination]
-> Maybe [ChannelEgressEndpoint]
-> Maybe EncoderSettings
-> Maybe Text
-> Maybe [InputAttachment]
-> Maybe InputSpecification
-> Maybe LogLevel
-> Maybe MaintenanceStatus
-> Maybe Text
-> Maybe [PipelineDetail]
-> Maybe Int
-> Maybe Text
-> Maybe ChannelState
-> Maybe (HashMap Text Text)
-> Maybe VpcOutputSettingsDescription
-> Int
-> DescribeChannelResponse
DescribeChannelResponse'
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
"cdiInputSpecification")
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
"channelClass")
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
"destinations" 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
"egressEndpoints"
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
"encoderSettings")
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
"inputAttachments"
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
"inputSpecification")
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
"logLevel")
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
"maintenance")
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
"pipelineDetails"
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
"pipelinesRunningCount")
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
"roleArn")
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
"state")
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
"vpc")
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 DescribeChannel where
hashWithSalt :: Int -> DescribeChannel -> Int
hashWithSalt Int
_salt DescribeChannel' {Text
channelId :: Text
$sel:channelId:DescribeChannel' :: DescribeChannel -> Text
..} =
Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
channelId
instance Prelude.NFData DescribeChannel where
rnf :: DescribeChannel -> ()
rnf DescribeChannel' {Text
channelId :: Text
$sel:channelId:DescribeChannel' :: DescribeChannel -> Text
..} = forall a. NFData a => a -> ()
Prelude.rnf Text
channelId
instance Data.ToHeaders DescribeChannel where
toHeaders :: DescribeChannel -> 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 DescribeChannel where
toPath :: DescribeChannel -> ByteString
toPath DescribeChannel' {Text
channelId :: Text
$sel:channelId:DescribeChannel' :: DescribeChannel -> Text
..} =
forall a. Monoid a => [a] -> a
Prelude.mconcat
[ByteString
"/prod/channels/", forall a. ToByteString a => a -> ByteString
Data.toBS Text
channelId]
instance Data.ToQuery DescribeChannel where
toQuery :: DescribeChannel -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty
data DescribeChannelResponse = DescribeChannelResponse'
{
DescribeChannelResponse -> Maybe Text
arn :: Prelude.Maybe Prelude.Text,
DescribeChannelResponse -> Maybe CdiInputSpecification
cdiInputSpecification :: Prelude.Maybe CdiInputSpecification,
DescribeChannelResponse -> Maybe ChannelClass
channelClass :: Prelude.Maybe ChannelClass,
DescribeChannelResponse -> Maybe [OutputDestination]
destinations :: Prelude.Maybe [OutputDestination],
DescribeChannelResponse -> Maybe [ChannelEgressEndpoint]
egressEndpoints :: Prelude.Maybe [ChannelEgressEndpoint],
DescribeChannelResponse -> Maybe EncoderSettings
encoderSettings :: Prelude.Maybe EncoderSettings,
DescribeChannelResponse -> Maybe Text
id :: Prelude.Maybe Prelude.Text,
DescribeChannelResponse -> Maybe [InputAttachment]
inputAttachments :: Prelude.Maybe [InputAttachment],
DescribeChannelResponse -> Maybe InputSpecification
inputSpecification :: Prelude.Maybe InputSpecification,
DescribeChannelResponse -> Maybe LogLevel
logLevel :: Prelude.Maybe LogLevel,
DescribeChannelResponse -> Maybe MaintenanceStatus
maintenance :: Prelude.Maybe MaintenanceStatus,
DescribeChannelResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
DescribeChannelResponse -> Maybe [PipelineDetail]
pipelineDetails :: Prelude.Maybe [PipelineDetail],
DescribeChannelResponse -> Maybe Int
pipelinesRunningCount :: Prelude.Maybe Prelude.Int,
DescribeChannelResponse -> Maybe Text
roleArn :: Prelude.Maybe Prelude.Text,
DescribeChannelResponse -> Maybe ChannelState
state :: Prelude.Maybe ChannelState,
DescribeChannelResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
DescribeChannelResponse -> Maybe VpcOutputSettingsDescription
vpc :: Prelude.Maybe VpcOutputSettingsDescription,
DescribeChannelResponse -> Int
httpStatus :: Prelude.Int
}
deriving (DescribeChannelResponse -> DescribeChannelResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeChannelResponse -> DescribeChannelResponse -> Bool
$c/= :: DescribeChannelResponse -> DescribeChannelResponse -> Bool
== :: DescribeChannelResponse -> DescribeChannelResponse -> Bool
$c== :: DescribeChannelResponse -> DescribeChannelResponse -> Bool
Prelude.Eq, ReadPrec [DescribeChannelResponse]
ReadPrec DescribeChannelResponse
Int -> ReadS DescribeChannelResponse
ReadS [DescribeChannelResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeChannelResponse]
$creadListPrec :: ReadPrec [DescribeChannelResponse]
readPrec :: ReadPrec DescribeChannelResponse
$creadPrec :: ReadPrec DescribeChannelResponse
readList :: ReadS [DescribeChannelResponse]
$creadList :: ReadS [DescribeChannelResponse]
readsPrec :: Int -> ReadS DescribeChannelResponse
$creadsPrec :: Int -> ReadS DescribeChannelResponse
Prelude.Read, Int -> DescribeChannelResponse -> ShowS
[DescribeChannelResponse] -> ShowS
DescribeChannelResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeChannelResponse] -> ShowS
$cshowList :: [DescribeChannelResponse] -> ShowS
show :: DescribeChannelResponse -> String
$cshow :: DescribeChannelResponse -> String
showsPrec :: Int -> DescribeChannelResponse -> ShowS
$cshowsPrec :: Int -> DescribeChannelResponse -> ShowS
Prelude.Show, forall x. Rep DescribeChannelResponse x -> DescribeChannelResponse
forall x. DescribeChannelResponse -> Rep DescribeChannelResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeChannelResponse x -> DescribeChannelResponse
$cfrom :: forall x. DescribeChannelResponse -> Rep DescribeChannelResponse x
Prelude.Generic)
newDescribeChannelResponse ::
Prelude.Int ->
DescribeChannelResponse
newDescribeChannelResponse :: Int -> DescribeChannelResponse
newDescribeChannelResponse Int
pHttpStatus_ =
DescribeChannelResponse'
{ $sel:arn:DescribeChannelResponse' :: Maybe Text
arn = forall a. Maybe a
Prelude.Nothing,
$sel:cdiInputSpecification:DescribeChannelResponse' :: Maybe CdiInputSpecification
cdiInputSpecification = forall a. Maybe a
Prelude.Nothing,
$sel:channelClass:DescribeChannelResponse' :: Maybe ChannelClass
channelClass = forall a. Maybe a
Prelude.Nothing,
$sel:destinations:DescribeChannelResponse' :: Maybe [OutputDestination]
destinations = forall a. Maybe a
Prelude.Nothing,
$sel:egressEndpoints:DescribeChannelResponse' :: Maybe [ChannelEgressEndpoint]
egressEndpoints = forall a. Maybe a
Prelude.Nothing,
$sel:encoderSettings:DescribeChannelResponse' :: Maybe EncoderSettings
encoderSettings = forall a. Maybe a
Prelude.Nothing,
$sel:id:DescribeChannelResponse' :: Maybe Text
id = forall a. Maybe a
Prelude.Nothing,
$sel:inputAttachments:DescribeChannelResponse' :: Maybe [InputAttachment]
inputAttachments = forall a. Maybe a
Prelude.Nothing,
$sel:inputSpecification:DescribeChannelResponse' :: Maybe InputSpecification
inputSpecification = forall a. Maybe a
Prelude.Nothing,
$sel:logLevel:DescribeChannelResponse' :: Maybe LogLevel
logLevel = forall a. Maybe a
Prelude.Nothing,
$sel:maintenance:DescribeChannelResponse' :: Maybe MaintenanceStatus
maintenance = forall a. Maybe a
Prelude.Nothing,
$sel:name:DescribeChannelResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
$sel:pipelineDetails:DescribeChannelResponse' :: Maybe [PipelineDetail]
pipelineDetails = forall a. Maybe a
Prelude.Nothing,
$sel:pipelinesRunningCount:DescribeChannelResponse' :: Maybe Int
pipelinesRunningCount = forall a. Maybe a
Prelude.Nothing,
$sel:roleArn:DescribeChannelResponse' :: Maybe Text
roleArn = forall a. Maybe a
Prelude.Nothing,
$sel:state:DescribeChannelResponse' :: Maybe ChannelState
state = forall a. Maybe a
Prelude.Nothing,
$sel:tags:DescribeChannelResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
$sel:vpc:DescribeChannelResponse' :: Maybe VpcOutputSettingsDescription
vpc = forall a. Maybe a
Prelude.Nothing,
$sel:httpStatus:DescribeChannelResponse' :: Int
httpStatus = Int
pHttpStatus_
}
describeChannelResponse_arn :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe Prelude.Text)
describeChannelResponse_arn :: Lens' DescribeChannelResponse (Maybe Text)
describeChannelResponse_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe Text
arn :: Maybe Text
$sel:arn:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Text
arn} -> Maybe Text
arn) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe Text
a -> DescribeChannelResponse
s {$sel:arn:DescribeChannelResponse' :: Maybe Text
arn = Maybe Text
a} :: DescribeChannelResponse)
describeChannelResponse_cdiInputSpecification :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe CdiInputSpecification)
describeChannelResponse_cdiInputSpecification :: Lens' DescribeChannelResponse (Maybe CdiInputSpecification)
describeChannelResponse_cdiInputSpecification = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe CdiInputSpecification
cdiInputSpecification :: Maybe CdiInputSpecification
$sel:cdiInputSpecification:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe CdiInputSpecification
cdiInputSpecification} -> Maybe CdiInputSpecification
cdiInputSpecification) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe CdiInputSpecification
a -> DescribeChannelResponse
s {$sel:cdiInputSpecification:DescribeChannelResponse' :: Maybe CdiInputSpecification
cdiInputSpecification = Maybe CdiInputSpecification
a} :: DescribeChannelResponse)
describeChannelResponse_channelClass :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe ChannelClass)
describeChannelResponse_channelClass :: Lens' DescribeChannelResponse (Maybe ChannelClass)
describeChannelResponse_channelClass = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe ChannelClass
channelClass :: Maybe ChannelClass
$sel:channelClass:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe ChannelClass
channelClass} -> Maybe ChannelClass
channelClass) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe ChannelClass
a -> DescribeChannelResponse
s {$sel:channelClass:DescribeChannelResponse' :: Maybe ChannelClass
channelClass = Maybe ChannelClass
a} :: DescribeChannelResponse)
describeChannelResponse_destinations :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe [OutputDestination])
describeChannelResponse_destinations :: Lens' DescribeChannelResponse (Maybe [OutputDestination])
describeChannelResponse_destinations = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe [OutputDestination]
destinations :: Maybe [OutputDestination]
$sel:destinations:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe [OutputDestination]
destinations} -> Maybe [OutputDestination]
destinations) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe [OutputDestination]
a -> DescribeChannelResponse
s {$sel:destinations:DescribeChannelResponse' :: Maybe [OutputDestination]
destinations = Maybe [OutputDestination]
a} :: DescribeChannelResponse) 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
describeChannelResponse_egressEndpoints :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe [ChannelEgressEndpoint])
describeChannelResponse_egressEndpoints :: Lens' DescribeChannelResponse (Maybe [ChannelEgressEndpoint])
describeChannelResponse_egressEndpoints = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe [ChannelEgressEndpoint]
egressEndpoints :: Maybe [ChannelEgressEndpoint]
$sel:egressEndpoints:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe [ChannelEgressEndpoint]
egressEndpoints} -> Maybe [ChannelEgressEndpoint]
egressEndpoints) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe [ChannelEgressEndpoint]
a -> DescribeChannelResponse
s {$sel:egressEndpoints:DescribeChannelResponse' :: Maybe [ChannelEgressEndpoint]
egressEndpoints = Maybe [ChannelEgressEndpoint]
a} :: DescribeChannelResponse) 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
describeChannelResponse_encoderSettings :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe EncoderSettings)
describeChannelResponse_encoderSettings :: Lens' DescribeChannelResponse (Maybe EncoderSettings)
describeChannelResponse_encoderSettings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe EncoderSettings
encoderSettings :: Maybe EncoderSettings
$sel:encoderSettings:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe EncoderSettings
encoderSettings} -> Maybe EncoderSettings
encoderSettings) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe EncoderSettings
a -> DescribeChannelResponse
s {$sel:encoderSettings:DescribeChannelResponse' :: Maybe EncoderSettings
encoderSettings = Maybe EncoderSettings
a} :: DescribeChannelResponse)
describeChannelResponse_id :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe Prelude.Text)
describeChannelResponse_id :: Lens' DescribeChannelResponse (Maybe Text)
describeChannelResponse_id = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe Text
id :: Maybe Text
$sel:id:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Text
id} -> Maybe Text
id) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe Text
a -> DescribeChannelResponse
s {$sel:id:DescribeChannelResponse' :: Maybe Text
id = Maybe Text
a} :: DescribeChannelResponse)
describeChannelResponse_inputAttachments :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe [InputAttachment])
describeChannelResponse_inputAttachments :: Lens' DescribeChannelResponse (Maybe [InputAttachment])
describeChannelResponse_inputAttachments = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe [InputAttachment]
inputAttachments :: Maybe [InputAttachment]
$sel:inputAttachments:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe [InputAttachment]
inputAttachments} -> Maybe [InputAttachment]
inputAttachments) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe [InputAttachment]
a -> DescribeChannelResponse
s {$sel:inputAttachments:DescribeChannelResponse' :: Maybe [InputAttachment]
inputAttachments = Maybe [InputAttachment]
a} :: DescribeChannelResponse) 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
describeChannelResponse_inputSpecification :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe InputSpecification)
describeChannelResponse_inputSpecification :: Lens' DescribeChannelResponse (Maybe InputSpecification)
describeChannelResponse_inputSpecification = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe InputSpecification
inputSpecification :: Maybe InputSpecification
$sel:inputSpecification:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe InputSpecification
inputSpecification} -> Maybe InputSpecification
inputSpecification) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe InputSpecification
a -> DescribeChannelResponse
s {$sel:inputSpecification:DescribeChannelResponse' :: Maybe InputSpecification
inputSpecification = Maybe InputSpecification
a} :: DescribeChannelResponse)
describeChannelResponse_logLevel :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe LogLevel)
describeChannelResponse_logLevel :: Lens' DescribeChannelResponse (Maybe LogLevel)
describeChannelResponse_logLevel = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe LogLevel
logLevel :: Maybe LogLevel
$sel:logLevel:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe LogLevel
logLevel} -> Maybe LogLevel
logLevel) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe LogLevel
a -> DescribeChannelResponse
s {$sel:logLevel:DescribeChannelResponse' :: Maybe LogLevel
logLevel = Maybe LogLevel
a} :: DescribeChannelResponse)
describeChannelResponse_maintenance :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe MaintenanceStatus)
describeChannelResponse_maintenance :: Lens' DescribeChannelResponse (Maybe MaintenanceStatus)
describeChannelResponse_maintenance = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe MaintenanceStatus
maintenance :: Maybe MaintenanceStatus
$sel:maintenance:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe MaintenanceStatus
maintenance} -> Maybe MaintenanceStatus
maintenance) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe MaintenanceStatus
a -> DescribeChannelResponse
s {$sel:maintenance:DescribeChannelResponse' :: Maybe MaintenanceStatus
maintenance = Maybe MaintenanceStatus
a} :: DescribeChannelResponse)
describeChannelResponse_name :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe Prelude.Text)
describeChannelResponse_name :: Lens' DescribeChannelResponse (Maybe Text)
describeChannelResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe Text
name :: Maybe Text
$sel:name:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe Text
a -> DescribeChannelResponse
s {$sel:name:DescribeChannelResponse' :: Maybe Text
name = Maybe Text
a} :: DescribeChannelResponse)
describeChannelResponse_pipelineDetails :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe [PipelineDetail])
describeChannelResponse_pipelineDetails :: Lens' DescribeChannelResponse (Maybe [PipelineDetail])
describeChannelResponse_pipelineDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe [PipelineDetail]
pipelineDetails :: Maybe [PipelineDetail]
$sel:pipelineDetails:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe [PipelineDetail]
pipelineDetails} -> Maybe [PipelineDetail]
pipelineDetails) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe [PipelineDetail]
a -> DescribeChannelResponse
s {$sel:pipelineDetails:DescribeChannelResponse' :: Maybe [PipelineDetail]
pipelineDetails = Maybe [PipelineDetail]
a} :: DescribeChannelResponse) 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
describeChannelResponse_pipelinesRunningCount :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe Prelude.Int)
describeChannelResponse_pipelinesRunningCount :: Lens' DescribeChannelResponse (Maybe Int)
describeChannelResponse_pipelinesRunningCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe Int
pipelinesRunningCount :: Maybe Int
$sel:pipelinesRunningCount:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Int
pipelinesRunningCount} -> Maybe Int
pipelinesRunningCount) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe Int
a -> DescribeChannelResponse
s {$sel:pipelinesRunningCount:DescribeChannelResponse' :: Maybe Int
pipelinesRunningCount = Maybe Int
a} :: DescribeChannelResponse)
describeChannelResponse_roleArn :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe Prelude.Text)
describeChannelResponse_roleArn :: Lens' DescribeChannelResponse (Maybe Text)
describeChannelResponse_roleArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe Text
roleArn :: Maybe Text
$sel:roleArn:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Text
roleArn} -> Maybe Text
roleArn) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe Text
a -> DescribeChannelResponse
s {$sel:roleArn:DescribeChannelResponse' :: Maybe Text
roleArn = Maybe Text
a} :: DescribeChannelResponse)
describeChannelResponse_state :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe ChannelState)
describeChannelResponse_state :: Lens' DescribeChannelResponse (Maybe ChannelState)
describeChannelResponse_state = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe ChannelState
state :: Maybe ChannelState
$sel:state:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe ChannelState
state} -> Maybe ChannelState
state) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe ChannelState
a -> DescribeChannelResponse
s {$sel:state:DescribeChannelResponse' :: Maybe ChannelState
state = Maybe ChannelState
a} :: DescribeChannelResponse)
describeChannelResponse_tags :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
describeChannelResponse_tags :: Lens' DescribeChannelResponse (Maybe (HashMap Text Text))
describeChannelResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe (HashMap Text Text)
a -> DescribeChannelResponse
s {$sel:tags:DescribeChannelResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: DescribeChannelResponse) 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
describeChannelResponse_vpc :: Lens.Lens' DescribeChannelResponse (Prelude.Maybe VpcOutputSettingsDescription)
describeChannelResponse_vpc :: Lens' DescribeChannelResponse (Maybe VpcOutputSettingsDescription)
describeChannelResponse_vpc = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Maybe VpcOutputSettingsDescription
vpc :: Maybe VpcOutputSettingsDescription
$sel:vpc:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe VpcOutputSettingsDescription
vpc} -> Maybe VpcOutputSettingsDescription
vpc) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Maybe VpcOutputSettingsDescription
a -> DescribeChannelResponse
s {$sel:vpc:DescribeChannelResponse' :: Maybe VpcOutputSettingsDescription
vpc = Maybe VpcOutputSettingsDescription
a} :: DescribeChannelResponse)
describeChannelResponse_httpStatus :: Lens.Lens' DescribeChannelResponse Prelude.Int
describeChannelResponse_httpStatus :: Lens' DescribeChannelResponse Int
describeChannelResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeChannelResponse' {Int
httpStatus :: Int
$sel:httpStatus:DescribeChannelResponse' :: DescribeChannelResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: DescribeChannelResponse
s@DescribeChannelResponse' {} Int
a -> DescribeChannelResponse
s {$sel:httpStatus:DescribeChannelResponse' :: Int
httpStatus = Int
a} :: DescribeChannelResponse)
instance Prelude.NFData DescribeChannelResponse where
rnf :: DescribeChannelResponse -> ()
rnf DescribeChannelResponse' {Int
Maybe Int
Maybe [ChannelEgressEndpoint]
Maybe [OutputDestination]
Maybe [PipelineDetail]
Maybe [InputAttachment]
Maybe Text
Maybe (HashMap Text Text)
Maybe CdiInputSpecification
Maybe ChannelClass
Maybe ChannelState
Maybe InputSpecification
Maybe LogLevel
Maybe MaintenanceStatus
Maybe VpcOutputSettingsDescription
Maybe EncoderSettings
httpStatus :: Int
vpc :: Maybe VpcOutputSettingsDescription
tags :: Maybe (HashMap Text Text)
state :: Maybe ChannelState
roleArn :: Maybe Text
pipelinesRunningCount :: Maybe Int
pipelineDetails :: Maybe [PipelineDetail]
name :: Maybe Text
maintenance :: Maybe MaintenanceStatus
logLevel :: Maybe LogLevel
inputSpecification :: Maybe InputSpecification
inputAttachments :: Maybe [InputAttachment]
id :: Maybe Text
encoderSettings :: Maybe EncoderSettings
egressEndpoints :: Maybe [ChannelEgressEndpoint]
destinations :: Maybe [OutputDestination]
channelClass :: Maybe ChannelClass
cdiInputSpecification :: Maybe CdiInputSpecification
arn :: Maybe Text
$sel:httpStatus:DescribeChannelResponse' :: DescribeChannelResponse -> Int
$sel:vpc:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe VpcOutputSettingsDescription
$sel:tags:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe (HashMap Text Text)
$sel:state:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe ChannelState
$sel:roleArn:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Text
$sel:pipelinesRunningCount:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Int
$sel:pipelineDetails:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe [PipelineDetail]
$sel:name:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Text
$sel:maintenance:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe MaintenanceStatus
$sel:logLevel:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe LogLevel
$sel:inputSpecification:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe InputSpecification
$sel:inputAttachments:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe [InputAttachment]
$sel:id:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe Text
$sel:encoderSettings:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe EncoderSettings
$sel:egressEndpoints:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe [ChannelEgressEndpoint]
$sel:destinations:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe [OutputDestination]
$sel:channelClass:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe ChannelClass
$sel:cdiInputSpecification:DescribeChannelResponse' :: DescribeChannelResponse -> Maybe CdiInputSpecification
$sel:arn:DescribeChannelResponse' :: DescribeChannelResponse -> 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 CdiInputSpecification
cdiInputSpecification
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ChannelClass
channelClass
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [OutputDestination]
destinations
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [ChannelEgressEndpoint]
egressEndpoints
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe EncoderSettings
encoderSettings
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 [InputAttachment]
inputAttachments
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe InputSpecification
inputSpecification
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LogLevel
logLevel
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe MaintenanceStatus
maintenance
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 [PipelineDetail]
pipelineDetails
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
pipelinesRunningCount
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
roleArn
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ChannelState
state
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 VpcOutputSettingsDescription
vpc
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus