{-# 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.MediaLive.DescribeInput
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Produces details about an input
module Amazonka.MediaLive.DescribeInput
  ( -- * Creating a Request
    DescribeInput (..),
    newDescribeInput,

    -- * Request Lenses
    describeInput_inputId,

    -- * Destructuring the Response
    DescribeInputResponse (..),
    newDescribeInputResponse,

    -- * Response Lenses
    describeInputResponse_arn,
    describeInputResponse_attachedChannels,
    describeInputResponse_destinations,
    describeInputResponse_id,
    describeInputResponse_inputClass,
    describeInputResponse_inputDevices,
    describeInputResponse_inputPartnerIds,
    describeInputResponse_inputSourceType,
    describeInputResponse_mediaConnectFlows,
    describeInputResponse_name,
    describeInputResponse_roleArn,
    describeInputResponse_securityGroups,
    describeInputResponse_sources,
    describeInputResponse_state,
    describeInputResponse_tags,
    describeInputResponse_type,
    describeInputResponse_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

-- | Placeholder documentation for DescribeInputRequest
--
-- /See:/ 'newDescribeInput' smart constructor.
data DescribeInput = DescribeInput'
  { -- | Unique ID of the input
    DescribeInput -> Text
inputId :: Prelude.Text
  }
  deriving (DescribeInput -> DescribeInput -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeInput -> DescribeInput -> Bool
$c/= :: DescribeInput -> DescribeInput -> Bool
== :: DescribeInput -> DescribeInput -> Bool
$c== :: DescribeInput -> DescribeInput -> Bool
Prelude.Eq, ReadPrec [DescribeInput]
ReadPrec DescribeInput
Int -> ReadS DescribeInput
ReadS [DescribeInput]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeInput]
$creadListPrec :: ReadPrec [DescribeInput]
readPrec :: ReadPrec DescribeInput
$creadPrec :: ReadPrec DescribeInput
readList :: ReadS [DescribeInput]
$creadList :: ReadS [DescribeInput]
readsPrec :: Int -> ReadS DescribeInput
$creadsPrec :: Int -> ReadS DescribeInput
Prelude.Read, Int -> DescribeInput -> ShowS
[DescribeInput] -> ShowS
DescribeInput -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeInput] -> ShowS
$cshowList :: [DescribeInput] -> ShowS
show :: DescribeInput -> String
$cshow :: DescribeInput -> String
showsPrec :: Int -> DescribeInput -> ShowS
$cshowsPrec :: Int -> DescribeInput -> ShowS
Prelude.Show, forall x. Rep DescribeInput x -> DescribeInput
forall x. DescribeInput -> Rep DescribeInput x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeInput x -> DescribeInput
$cfrom :: forall x. DescribeInput -> Rep DescribeInput x
Prelude.Generic)

-- |
-- Create a value of 'DescribeInput' 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:
--
-- 'inputId', 'describeInput_inputId' - Unique ID of the input
newDescribeInput ::
  -- | 'inputId'
  Prelude.Text ->
  DescribeInput
newDescribeInput :: Text -> DescribeInput
newDescribeInput Text
pInputId_ =
  DescribeInput' {$sel:inputId:DescribeInput' :: Text
inputId = Text
pInputId_}

-- | Unique ID of the input
describeInput_inputId :: Lens.Lens' DescribeInput Prelude.Text
describeInput_inputId :: Lens' DescribeInput Text
describeInput_inputId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInput' {Text
inputId :: Text
$sel:inputId:DescribeInput' :: DescribeInput -> Text
inputId} -> Text
inputId) (\s :: DescribeInput
s@DescribeInput' {} Text
a -> DescribeInput
s {$sel:inputId:DescribeInput' :: Text
inputId = Text
a} :: DescribeInput)

instance Core.AWSRequest DescribeInput where
  type
    AWSResponse DescribeInput =
      DescribeInputResponse
  request :: (Service -> Service) -> DescribeInput -> Request DescribeInput
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 DescribeInput
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse DescribeInput)))
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 [InputDestination]
-> Maybe Text
-> Maybe InputClass
-> Maybe [InputDeviceSettings]
-> Maybe [Text]
-> Maybe InputSourceType
-> Maybe [MediaConnectFlow]
-> Maybe Text
-> Maybe Text
-> Maybe [Text]
-> Maybe [InputSource]
-> Maybe InputState
-> Maybe (HashMap Text Text)
-> Maybe InputType
-> Int
-> DescribeInputResponse
DescribeInputResponse'
            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
"attachedChannels"
                            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
"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
"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
"inputClass")
            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
"inputDevices" 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
"inputPartnerIds"
                            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
"inputSourceType")
            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
"mediaConnectFlows"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"name")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"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
"securityGroups" 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
"sources" 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
"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
"type")
            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 DescribeInput where
  hashWithSalt :: Int -> DescribeInput -> Int
hashWithSalt Int
_salt DescribeInput' {Text
inputId :: Text
$sel:inputId:DescribeInput' :: DescribeInput -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
inputId

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

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

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

-- | Placeholder documentation for DescribeInputResponse
--
-- /See:/ 'newDescribeInputResponse' smart constructor.
data DescribeInputResponse = DescribeInputResponse'
  { -- | The Unique ARN of the input (generated, immutable).
    DescribeInputResponse -> Maybe Text
arn :: Prelude.Maybe Prelude.Text,
    -- | A list of channel IDs that that input is attached to (currently an input
    -- can only be attached to one channel).
    DescribeInputResponse -> Maybe [Text]
attachedChannels :: Prelude.Maybe [Prelude.Text],
    -- | A list of the destinations of the input (PUSH-type).
    DescribeInputResponse -> Maybe [InputDestination]
destinations :: Prelude.Maybe [InputDestination],
    -- | The generated ID of the input (unique for user account, immutable).
    DescribeInputResponse -> Maybe Text
id :: Prelude.Maybe Prelude.Text,
    -- | STANDARD - MediaLive expects two sources to be connected to this input.
    -- If the channel is also STANDARD, both sources will be ingested. If the
    -- channel is SINGLE_PIPELINE, only the first source will be ingested; the
    -- second source will always be ignored, even if the first source fails.
    -- SINGLE_PIPELINE - You can connect only one source to this input. If the
    -- ChannelClass is also SINGLE_PIPELINE, this value is valid. If the
    -- ChannelClass is STANDARD, this value is not valid because the channel
    -- requires two sources in the input.
    DescribeInputResponse -> Maybe InputClass
inputClass :: Prelude.Maybe InputClass,
    -- | Settings for the input devices.
    DescribeInputResponse -> Maybe [InputDeviceSettings]
inputDevices :: Prelude.Maybe [InputDeviceSettings],
    -- | A list of IDs for all Inputs which are partners of this one.
    DescribeInputResponse -> Maybe [Text]
inputPartnerIds :: Prelude.Maybe [Prelude.Text],
    -- | Certain pull input sources can be dynamic, meaning that they can have
    -- their URL\'s dynamically changes during input switch actions. Presently,
    -- this functionality only works with MP4_FILE and TS_FILE inputs.
    DescribeInputResponse -> Maybe InputSourceType
inputSourceType :: Prelude.Maybe InputSourceType,
    -- | A list of MediaConnect Flows for this input.
    DescribeInputResponse -> Maybe [MediaConnectFlow]
mediaConnectFlows :: Prelude.Maybe [MediaConnectFlow],
    -- | The user-assigned name (This is a mutable value).
    DescribeInputResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name (ARN) of the role this input assumes during and
    -- after creation.
    DescribeInputResponse -> Maybe Text
roleArn :: Prelude.Maybe Prelude.Text,
    -- | A list of IDs for all the Input Security Groups attached to the input.
    DescribeInputResponse -> Maybe [Text]
securityGroups :: Prelude.Maybe [Prelude.Text],
    -- | A list of the sources of the input (PULL-type).
    DescribeInputResponse -> Maybe [InputSource]
sources :: Prelude.Maybe [InputSource],
    DescribeInputResponse -> Maybe InputState
state :: Prelude.Maybe InputState,
    -- | A collection of key-value pairs.
    DescribeInputResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    DescribeInputResponse -> Maybe InputType
type' :: Prelude.Maybe InputType,
    -- | The response's http status code.
    DescribeInputResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeInputResponse -> DescribeInputResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeInputResponse -> DescribeInputResponse -> Bool
$c/= :: DescribeInputResponse -> DescribeInputResponse -> Bool
== :: DescribeInputResponse -> DescribeInputResponse -> Bool
$c== :: DescribeInputResponse -> DescribeInputResponse -> Bool
Prelude.Eq, ReadPrec [DescribeInputResponse]
ReadPrec DescribeInputResponse
Int -> ReadS DescribeInputResponse
ReadS [DescribeInputResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeInputResponse]
$creadListPrec :: ReadPrec [DescribeInputResponse]
readPrec :: ReadPrec DescribeInputResponse
$creadPrec :: ReadPrec DescribeInputResponse
readList :: ReadS [DescribeInputResponse]
$creadList :: ReadS [DescribeInputResponse]
readsPrec :: Int -> ReadS DescribeInputResponse
$creadsPrec :: Int -> ReadS DescribeInputResponse
Prelude.Read, Int -> DescribeInputResponse -> ShowS
[DescribeInputResponse] -> ShowS
DescribeInputResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeInputResponse] -> ShowS
$cshowList :: [DescribeInputResponse] -> ShowS
show :: DescribeInputResponse -> String
$cshow :: DescribeInputResponse -> String
showsPrec :: Int -> DescribeInputResponse -> ShowS
$cshowsPrec :: Int -> DescribeInputResponse -> ShowS
Prelude.Show, forall x. Rep DescribeInputResponse x -> DescribeInputResponse
forall x. DescribeInputResponse -> Rep DescribeInputResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeInputResponse x -> DescribeInputResponse
$cfrom :: forall x. DescribeInputResponse -> Rep DescribeInputResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeInputResponse' 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', 'describeInputResponse_arn' - The Unique ARN of the input (generated, immutable).
--
-- 'attachedChannels', 'describeInputResponse_attachedChannels' - A list of channel IDs that that input is attached to (currently an input
-- can only be attached to one channel).
--
-- 'destinations', 'describeInputResponse_destinations' - A list of the destinations of the input (PUSH-type).
--
-- 'id', 'describeInputResponse_id' - The generated ID of the input (unique for user account, immutable).
--
-- 'inputClass', 'describeInputResponse_inputClass' - STANDARD - MediaLive expects two sources to be connected to this input.
-- If the channel is also STANDARD, both sources will be ingested. If the
-- channel is SINGLE_PIPELINE, only the first source will be ingested; the
-- second source will always be ignored, even if the first source fails.
-- SINGLE_PIPELINE - You can connect only one source to this input. If the
-- ChannelClass is also SINGLE_PIPELINE, this value is valid. If the
-- ChannelClass is STANDARD, this value is not valid because the channel
-- requires two sources in the input.
--
-- 'inputDevices', 'describeInputResponse_inputDevices' - Settings for the input devices.
--
-- 'inputPartnerIds', 'describeInputResponse_inputPartnerIds' - A list of IDs for all Inputs which are partners of this one.
--
-- 'inputSourceType', 'describeInputResponse_inputSourceType' - Certain pull input sources can be dynamic, meaning that they can have
-- their URL\'s dynamically changes during input switch actions. Presently,
-- this functionality only works with MP4_FILE and TS_FILE inputs.
--
-- 'mediaConnectFlows', 'describeInputResponse_mediaConnectFlows' - A list of MediaConnect Flows for this input.
--
-- 'name', 'describeInputResponse_name' - The user-assigned name (This is a mutable value).
--
-- 'roleArn', 'describeInputResponse_roleArn' - The Amazon Resource Name (ARN) of the role this input assumes during and
-- after creation.
--
-- 'securityGroups', 'describeInputResponse_securityGroups' - A list of IDs for all the Input Security Groups attached to the input.
--
-- 'sources', 'describeInputResponse_sources' - A list of the sources of the input (PULL-type).
--
-- 'state', 'describeInputResponse_state' - Undocumented member.
--
-- 'tags', 'describeInputResponse_tags' - A collection of key-value pairs.
--
-- 'type'', 'describeInputResponse_type' - Undocumented member.
--
-- 'httpStatus', 'describeInputResponse_httpStatus' - The response's http status code.
newDescribeInputResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeInputResponse
newDescribeInputResponse :: Int -> DescribeInputResponse
newDescribeInputResponse Int
pHttpStatus_ =
  DescribeInputResponse'
    { $sel:arn:DescribeInputResponse' :: Maybe Text
arn = forall a. Maybe a
Prelude.Nothing,
      $sel:attachedChannels:DescribeInputResponse' :: Maybe [Text]
attachedChannels = forall a. Maybe a
Prelude.Nothing,
      $sel:destinations:DescribeInputResponse' :: Maybe [InputDestination]
destinations = forall a. Maybe a
Prelude.Nothing,
      $sel:id:DescribeInputResponse' :: Maybe Text
id = forall a. Maybe a
Prelude.Nothing,
      $sel:inputClass:DescribeInputResponse' :: Maybe InputClass
inputClass = forall a. Maybe a
Prelude.Nothing,
      $sel:inputDevices:DescribeInputResponse' :: Maybe [InputDeviceSettings]
inputDevices = forall a. Maybe a
Prelude.Nothing,
      $sel:inputPartnerIds:DescribeInputResponse' :: Maybe [Text]
inputPartnerIds = forall a. Maybe a
Prelude.Nothing,
      $sel:inputSourceType:DescribeInputResponse' :: Maybe InputSourceType
inputSourceType = forall a. Maybe a
Prelude.Nothing,
      $sel:mediaConnectFlows:DescribeInputResponse' :: Maybe [MediaConnectFlow]
mediaConnectFlows = forall a. Maybe a
Prelude.Nothing,
      $sel:name:DescribeInputResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:roleArn:DescribeInputResponse' :: Maybe Text
roleArn = forall a. Maybe a
Prelude.Nothing,
      $sel:securityGroups:DescribeInputResponse' :: Maybe [Text]
securityGroups = forall a. Maybe a
Prelude.Nothing,
      $sel:sources:DescribeInputResponse' :: Maybe [InputSource]
sources = forall a. Maybe a
Prelude.Nothing,
      $sel:state:DescribeInputResponse' :: Maybe InputState
state = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:DescribeInputResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:type':DescribeInputResponse' :: Maybe InputType
type' = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeInputResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The Unique ARN of the input (generated, immutable).
describeInputResponse_arn :: Lens.Lens' DescribeInputResponse (Prelude.Maybe Prelude.Text)
describeInputResponse_arn :: Lens' DescribeInputResponse (Maybe Text)
describeInputResponse_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe Text
arn :: Maybe Text
$sel:arn:DescribeInputResponse' :: DescribeInputResponse -> Maybe Text
arn} -> Maybe Text
arn) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe Text
a -> DescribeInputResponse
s {$sel:arn:DescribeInputResponse' :: Maybe Text
arn = Maybe Text
a} :: DescribeInputResponse)

-- | A list of channel IDs that that input is attached to (currently an input
-- can only be attached to one channel).
describeInputResponse_attachedChannels :: Lens.Lens' DescribeInputResponse (Prelude.Maybe [Prelude.Text])
describeInputResponse_attachedChannels :: Lens' DescribeInputResponse (Maybe [Text])
describeInputResponse_attachedChannels = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe [Text]
attachedChannels :: Maybe [Text]
$sel:attachedChannels:DescribeInputResponse' :: DescribeInputResponse -> Maybe [Text]
attachedChannels} -> Maybe [Text]
attachedChannels) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe [Text]
a -> DescribeInputResponse
s {$sel:attachedChannels:DescribeInputResponse' :: Maybe [Text]
attachedChannels = Maybe [Text]
a} :: DescribeInputResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | A list of the destinations of the input (PUSH-type).
describeInputResponse_destinations :: Lens.Lens' DescribeInputResponse (Prelude.Maybe [InputDestination])
describeInputResponse_destinations :: Lens' DescribeInputResponse (Maybe [InputDestination])
describeInputResponse_destinations = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe [InputDestination]
destinations :: Maybe [InputDestination]
$sel:destinations:DescribeInputResponse' :: DescribeInputResponse -> Maybe [InputDestination]
destinations} -> Maybe [InputDestination]
destinations) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe [InputDestination]
a -> DescribeInputResponse
s {$sel:destinations:DescribeInputResponse' :: Maybe [InputDestination]
destinations = Maybe [InputDestination]
a} :: DescribeInputResponse) 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 generated ID of the input (unique for user account, immutable).
describeInputResponse_id :: Lens.Lens' DescribeInputResponse (Prelude.Maybe Prelude.Text)
describeInputResponse_id :: Lens' DescribeInputResponse (Maybe Text)
describeInputResponse_id = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe Text
id :: Maybe Text
$sel:id:DescribeInputResponse' :: DescribeInputResponse -> Maybe Text
id} -> Maybe Text
id) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe Text
a -> DescribeInputResponse
s {$sel:id:DescribeInputResponse' :: Maybe Text
id = Maybe Text
a} :: DescribeInputResponse)

-- | STANDARD - MediaLive expects two sources to be connected to this input.
-- If the channel is also STANDARD, both sources will be ingested. If the
-- channel is SINGLE_PIPELINE, only the first source will be ingested; the
-- second source will always be ignored, even if the first source fails.
-- SINGLE_PIPELINE - You can connect only one source to this input. If the
-- ChannelClass is also SINGLE_PIPELINE, this value is valid. If the
-- ChannelClass is STANDARD, this value is not valid because the channel
-- requires two sources in the input.
describeInputResponse_inputClass :: Lens.Lens' DescribeInputResponse (Prelude.Maybe InputClass)
describeInputResponse_inputClass :: Lens' DescribeInputResponse (Maybe InputClass)
describeInputResponse_inputClass = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe InputClass
inputClass :: Maybe InputClass
$sel:inputClass:DescribeInputResponse' :: DescribeInputResponse -> Maybe InputClass
inputClass} -> Maybe InputClass
inputClass) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe InputClass
a -> DescribeInputResponse
s {$sel:inputClass:DescribeInputResponse' :: Maybe InputClass
inputClass = Maybe InputClass
a} :: DescribeInputResponse)

-- | Settings for the input devices.
describeInputResponse_inputDevices :: Lens.Lens' DescribeInputResponse (Prelude.Maybe [InputDeviceSettings])
describeInputResponse_inputDevices :: Lens' DescribeInputResponse (Maybe [InputDeviceSettings])
describeInputResponse_inputDevices = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe [InputDeviceSettings]
inputDevices :: Maybe [InputDeviceSettings]
$sel:inputDevices:DescribeInputResponse' :: DescribeInputResponse -> Maybe [InputDeviceSettings]
inputDevices} -> Maybe [InputDeviceSettings]
inputDevices) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe [InputDeviceSettings]
a -> DescribeInputResponse
s {$sel:inputDevices:DescribeInputResponse' :: Maybe [InputDeviceSettings]
inputDevices = Maybe [InputDeviceSettings]
a} :: DescribeInputResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | A list of IDs for all Inputs which are partners of this one.
describeInputResponse_inputPartnerIds :: Lens.Lens' DescribeInputResponse (Prelude.Maybe [Prelude.Text])
describeInputResponse_inputPartnerIds :: Lens' DescribeInputResponse (Maybe [Text])
describeInputResponse_inputPartnerIds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe [Text]
inputPartnerIds :: Maybe [Text]
$sel:inputPartnerIds:DescribeInputResponse' :: DescribeInputResponse -> Maybe [Text]
inputPartnerIds} -> Maybe [Text]
inputPartnerIds) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe [Text]
a -> DescribeInputResponse
s {$sel:inputPartnerIds:DescribeInputResponse' :: Maybe [Text]
inputPartnerIds = Maybe [Text]
a} :: DescribeInputResponse) 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

-- | Certain pull input sources can be dynamic, meaning that they can have
-- their URL\'s dynamically changes during input switch actions. Presently,
-- this functionality only works with MP4_FILE and TS_FILE inputs.
describeInputResponse_inputSourceType :: Lens.Lens' DescribeInputResponse (Prelude.Maybe InputSourceType)
describeInputResponse_inputSourceType :: Lens' DescribeInputResponse (Maybe InputSourceType)
describeInputResponse_inputSourceType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe InputSourceType
inputSourceType :: Maybe InputSourceType
$sel:inputSourceType:DescribeInputResponse' :: DescribeInputResponse -> Maybe InputSourceType
inputSourceType} -> Maybe InputSourceType
inputSourceType) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe InputSourceType
a -> DescribeInputResponse
s {$sel:inputSourceType:DescribeInputResponse' :: Maybe InputSourceType
inputSourceType = Maybe InputSourceType
a} :: DescribeInputResponse)

-- | A list of MediaConnect Flows for this input.
describeInputResponse_mediaConnectFlows :: Lens.Lens' DescribeInputResponse (Prelude.Maybe [MediaConnectFlow])
describeInputResponse_mediaConnectFlows :: Lens' DescribeInputResponse (Maybe [MediaConnectFlow])
describeInputResponse_mediaConnectFlows = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe [MediaConnectFlow]
mediaConnectFlows :: Maybe [MediaConnectFlow]
$sel:mediaConnectFlows:DescribeInputResponse' :: DescribeInputResponse -> Maybe [MediaConnectFlow]
mediaConnectFlows} -> Maybe [MediaConnectFlow]
mediaConnectFlows) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe [MediaConnectFlow]
a -> DescribeInputResponse
s {$sel:mediaConnectFlows:DescribeInputResponse' :: Maybe [MediaConnectFlow]
mediaConnectFlows = Maybe [MediaConnectFlow]
a} :: DescribeInputResponse) 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 user-assigned name (This is a mutable value).
describeInputResponse_name :: Lens.Lens' DescribeInputResponse (Prelude.Maybe Prelude.Text)
describeInputResponse_name :: Lens' DescribeInputResponse (Maybe Text)
describeInputResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe Text
name :: Maybe Text
$sel:name:DescribeInputResponse' :: DescribeInputResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe Text
a -> DescribeInputResponse
s {$sel:name:DescribeInputResponse' :: Maybe Text
name = Maybe Text
a} :: DescribeInputResponse)

-- | The Amazon Resource Name (ARN) of the role this input assumes during and
-- after creation.
describeInputResponse_roleArn :: Lens.Lens' DescribeInputResponse (Prelude.Maybe Prelude.Text)
describeInputResponse_roleArn :: Lens' DescribeInputResponse (Maybe Text)
describeInputResponse_roleArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe Text
roleArn :: Maybe Text
$sel:roleArn:DescribeInputResponse' :: DescribeInputResponse -> Maybe Text
roleArn} -> Maybe Text
roleArn) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe Text
a -> DescribeInputResponse
s {$sel:roleArn:DescribeInputResponse' :: Maybe Text
roleArn = Maybe Text
a} :: DescribeInputResponse)

-- | A list of IDs for all the Input Security Groups attached to the input.
describeInputResponse_securityGroups :: Lens.Lens' DescribeInputResponse (Prelude.Maybe [Prelude.Text])
describeInputResponse_securityGroups :: Lens' DescribeInputResponse (Maybe [Text])
describeInputResponse_securityGroups = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe [Text]
securityGroups :: Maybe [Text]
$sel:securityGroups:DescribeInputResponse' :: DescribeInputResponse -> Maybe [Text]
securityGroups} -> Maybe [Text]
securityGroups) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe [Text]
a -> DescribeInputResponse
s {$sel:securityGroups:DescribeInputResponse' :: Maybe [Text]
securityGroups = Maybe [Text]
a} :: DescribeInputResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | A list of the sources of the input (PULL-type).
describeInputResponse_sources :: Lens.Lens' DescribeInputResponse (Prelude.Maybe [InputSource])
describeInputResponse_sources :: Lens' DescribeInputResponse (Maybe [InputSource])
describeInputResponse_sources = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe [InputSource]
sources :: Maybe [InputSource]
$sel:sources:DescribeInputResponse' :: DescribeInputResponse -> Maybe [InputSource]
sources} -> Maybe [InputSource]
sources) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe [InputSource]
a -> DescribeInputResponse
s {$sel:sources:DescribeInputResponse' :: Maybe [InputSource]
sources = Maybe [InputSource]
a} :: DescribeInputResponse) 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

-- | Undocumented member.
describeInputResponse_state :: Lens.Lens' DescribeInputResponse (Prelude.Maybe InputState)
describeInputResponse_state :: Lens' DescribeInputResponse (Maybe InputState)
describeInputResponse_state = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe InputState
state :: Maybe InputState
$sel:state:DescribeInputResponse' :: DescribeInputResponse -> Maybe InputState
state} -> Maybe InputState
state) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe InputState
a -> DescribeInputResponse
s {$sel:state:DescribeInputResponse' :: Maybe InputState
state = Maybe InputState
a} :: DescribeInputResponse)

-- | A collection of key-value pairs.
describeInputResponse_tags :: Lens.Lens' DescribeInputResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
describeInputResponse_tags :: Lens' DescribeInputResponse (Maybe (HashMap Text Text))
describeInputResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:DescribeInputResponse' :: DescribeInputResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe (HashMap Text Text)
a -> DescribeInputResponse
s {$sel:tags:DescribeInputResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: DescribeInputResponse) 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

-- | Undocumented member.
describeInputResponse_type :: Lens.Lens' DescribeInputResponse (Prelude.Maybe InputType)
describeInputResponse_type :: Lens' DescribeInputResponse (Maybe InputType)
describeInputResponse_type = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInputResponse' {Maybe InputType
type' :: Maybe InputType
$sel:type':DescribeInputResponse' :: DescribeInputResponse -> Maybe InputType
type'} -> Maybe InputType
type') (\s :: DescribeInputResponse
s@DescribeInputResponse' {} Maybe InputType
a -> DescribeInputResponse
s {$sel:type':DescribeInputResponse' :: Maybe InputType
type' = Maybe InputType
a} :: DescribeInputResponse)

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

instance Prelude.NFData DescribeInputResponse where
  rnf :: DescribeInputResponse -> ()
rnf DescribeInputResponse' {Int
Maybe [Text]
Maybe [InputDestination]
Maybe [InputDeviceSettings]
Maybe [InputSource]
Maybe [MediaConnectFlow]
Maybe Text
Maybe (HashMap Text Text)
Maybe InputClass
Maybe InputSourceType
Maybe InputState
Maybe InputType
httpStatus :: Int
type' :: Maybe InputType
tags :: Maybe (HashMap Text Text)
state :: Maybe InputState
sources :: Maybe [InputSource]
securityGroups :: Maybe [Text]
roleArn :: Maybe Text
name :: Maybe Text
mediaConnectFlows :: Maybe [MediaConnectFlow]
inputSourceType :: Maybe InputSourceType
inputPartnerIds :: Maybe [Text]
inputDevices :: Maybe [InputDeviceSettings]
inputClass :: Maybe InputClass
id :: Maybe Text
destinations :: Maybe [InputDestination]
attachedChannels :: Maybe [Text]
arn :: Maybe Text
$sel:httpStatus:DescribeInputResponse' :: DescribeInputResponse -> Int
$sel:type':DescribeInputResponse' :: DescribeInputResponse -> Maybe InputType
$sel:tags:DescribeInputResponse' :: DescribeInputResponse -> Maybe (HashMap Text Text)
$sel:state:DescribeInputResponse' :: DescribeInputResponse -> Maybe InputState
$sel:sources:DescribeInputResponse' :: DescribeInputResponse -> Maybe [InputSource]
$sel:securityGroups:DescribeInputResponse' :: DescribeInputResponse -> Maybe [Text]
$sel:roleArn:DescribeInputResponse' :: DescribeInputResponse -> Maybe Text
$sel:name:DescribeInputResponse' :: DescribeInputResponse -> Maybe Text
$sel:mediaConnectFlows:DescribeInputResponse' :: DescribeInputResponse -> Maybe [MediaConnectFlow]
$sel:inputSourceType:DescribeInputResponse' :: DescribeInputResponse -> Maybe InputSourceType
$sel:inputPartnerIds:DescribeInputResponse' :: DescribeInputResponse -> Maybe [Text]
$sel:inputDevices:DescribeInputResponse' :: DescribeInputResponse -> Maybe [InputDeviceSettings]
$sel:inputClass:DescribeInputResponse' :: DescribeInputResponse -> Maybe InputClass
$sel:id:DescribeInputResponse' :: DescribeInputResponse -> Maybe Text
$sel:destinations:DescribeInputResponse' :: DescribeInputResponse -> Maybe [InputDestination]
$sel:attachedChannels:DescribeInputResponse' :: DescribeInputResponse -> Maybe [Text]
$sel:arn:DescribeInputResponse' :: DescribeInputResponse -> 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]
attachedChannels
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [InputDestination]
destinations
      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 InputClass
inputClass
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [InputDeviceSettings]
inputDevices
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
inputPartnerIds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe InputSourceType
inputSourceType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [MediaConnectFlow]
mediaConnectFlows
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
roleArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
securityGroups
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [InputSource]
sources
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe InputState
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 InputType
type'
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus