{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.AutoScaling.Types.LifecycleHookSpecification
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.AutoScaling.Types.LifecycleHookSpecification where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude

-- | Describes information used to specify a lifecycle hook for an Auto
-- Scaling group.
--
-- For more information, see
-- <https://docs.aws.amazon.com/autoscaling/ec2/userguide/lifecycle-hooks.html Amazon EC2 Auto Scaling lifecycle hooks>
-- in the /Amazon EC2 Auto Scaling User Guide/.
--
-- /See:/ 'newLifecycleHookSpecification' smart constructor.
data LifecycleHookSpecification = LifecycleHookSpecification'
  { -- | The action the Auto Scaling group takes when the lifecycle hook timeout
    -- elapses or if an unexpected failure occurs. The default value is
    -- @ABANDON@.
    --
    -- Valid values: @CONTINUE@ | @ABANDON@
    LifecycleHookSpecification -> Maybe Text
defaultResult :: Prelude.Maybe Prelude.Text,
    -- | The maximum time, in seconds, that can elapse before the lifecycle hook
    -- times out. The range is from @30@ to @7200@ seconds. The default value
    -- is @3600@ seconds (1 hour).
    LifecycleHookSpecification -> Maybe Int
heartbeatTimeout :: Prelude.Maybe Prelude.Int,
    -- | Additional information that you want to include any time Amazon EC2 Auto
    -- Scaling sends a message to the notification target.
    LifecycleHookSpecification -> Maybe Text
notificationMetadata :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name (ARN) of the notification target that Amazon
    -- EC2 Auto Scaling sends notifications to when an instance is in a wait
    -- state for the lifecycle hook. You can specify an Amazon SNS topic or an
    -- Amazon SQS queue.
    LifecycleHookSpecification -> Maybe Text
notificationTargetARN :: Prelude.Maybe Prelude.Text,
    -- | The ARN of the IAM role that allows the Auto Scaling group to publish to
    -- the specified notification target. For information about creating this
    -- role, see
    -- <https://docs.aws.amazon.com/autoscaling/ec2/userguide/prepare-for-lifecycle-notifications.html#lifecycle-hook-notification-target Configure a notification target for a lifecycle hook>
    -- in the /Amazon EC2 Auto Scaling User Guide/.
    --
    -- Valid only if the notification target is an Amazon SNS topic or an
    -- Amazon SQS queue.
    LifecycleHookSpecification -> Maybe Text
roleARN :: Prelude.Maybe Prelude.Text,
    -- | The name of the lifecycle hook.
    LifecycleHookSpecification -> Text
lifecycleHookName :: Prelude.Text,
    -- | The lifecycle transition. For Auto Scaling groups, there are two major
    -- lifecycle transitions.
    --
    -- -   To create a lifecycle hook for scale-out events, specify
    --     @autoscaling:EC2_INSTANCE_LAUNCHING@.
    --
    -- -   To create a lifecycle hook for scale-in events, specify
    --     @autoscaling:EC2_INSTANCE_TERMINATING@.
    LifecycleHookSpecification -> Text
lifecycleTransition :: Prelude.Text
  }
  deriving (LifecycleHookSpecification -> LifecycleHookSpecification -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: LifecycleHookSpecification -> LifecycleHookSpecification -> Bool
$c/= :: LifecycleHookSpecification -> LifecycleHookSpecification -> Bool
== :: LifecycleHookSpecification -> LifecycleHookSpecification -> Bool
$c== :: LifecycleHookSpecification -> LifecycleHookSpecification -> Bool
Prelude.Eq, ReadPrec [LifecycleHookSpecification]
ReadPrec LifecycleHookSpecification
Int -> ReadS LifecycleHookSpecification
ReadS [LifecycleHookSpecification]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [LifecycleHookSpecification]
$creadListPrec :: ReadPrec [LifecycleHookSpecification]
readPrec :: ReadPrec LifecycleHookSpecification
$creadPrec :: ReadPrec LifecycleHookSpecification
readList :: ReadS [LifecycleHookSpecification]
$creadList :: ReadS [LifecycleHookSpecification]
readsPrec :: Int -> ReadS LifecycleHookSpecification
$creadsPrec :: Int -> ReadS LifecycleHookSpecification
Prelude.Read, Int -> LifecycleHookSpecification -> ShowS
[LifecycleHookSpecification] -> ShowS
LifecycleHookSpecification -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [LifecycleHookSpecification] -> ShowS
$cshowList :: [LifecycleHookSpecification] -> ShowS
show :: LifecycleHookSpecification -> String
$cshow :: LifecycleHookSpecification -> String
showsPrec :: Int -> LifecycleHookSpecification -> ShowS
$cshowsPrec :: Int -> LifecycleHookSpecification -> ShowS
Prelude.Show, forall x.
Rep LifecycleHookSpecification x -> LifecycleHookSpecification
forall x.
LifecycleHookSpecification -> Rep LifecycleHookSpecification x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep LifecycleHookSpecification x -> LifecycleHookSpecification
$cfrom :: forall x.
LifecycleHookSpecification -> Rep LifecycleHookSpecification x
Prelude.Generic)

-- |
-- Create a value of 'LifecycleHookSpecification' 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:
--
-- 'defaultResult', 'lifecycleHookSpecification_defaultResult' - The action the Auto Scaling group takes when the lifecycle hook timeout
-- elapses or if an unexpected failure occurs. The default value is
-- @ABANDON@.
--
-- Valid values: @CONTINUE@ | @ABANDON@
--
-- 'heartbeatTimeout', 'lifecycleHookSpecification_heartbeatTimeout' - The maximum time, in seconds, that can elapse before the lifecycle hook
-- times out. The range is from @30@ to @7200@ seconds. The default value
-- is @3600@ seconds (1 hour).
--
-- 'notificationMetadata', 'lifecycleHookSpecification_notificationMetadata' - Additional information that you want to include any time Amazon EC2 Auto
-- Scaling sends a message to the notification target.
--
-- 'notificationTargetARN', 'lifecycleHookSpecification_notificationTargetARN' - The Amazon Resource Name (ARN) of the notification target that Amazon
-- EC2 Auto Scaling sends notifications to when an instance is in a wait
-- state for the lifecycle hook. You can specify an Amazon SNS topic or an
-- Amazon SQS queue.
--
-- 'roleARN', 'lifecycleHookSpecification_roleARN' - The ARN of the IAM role that allows the Auto Scaling group to publish to
-- the specified notification target. For information about creating this
-- role, see
-- <https://docs.aws.amazon.com/autoscaling/ec2/userguide/prepare-for-lifecycle-notifications.html#lifecycle-hook-notification-target Configure a notification target for a lifecycle hook>
-- in the /Amazon EC2 Auto Scaling User Guide/.
--
-- Valid only if the notification target is an Amazon SNS topic or an
-- Amazon SQS queue.
--
-- 'lifecycleHookName', 'lifecycleHookSpecification_lifecycleHookName' - The name of the lifecycle hook.
--
-- 'lifecycleTransition', 'lifecycleHookSpecification_lifecycleTransition' - The lifecycle transition. For Auto Scaling groups, there are two major
-- lifecycle transitions.
--
-- -   To create a lifecycle hook for scale-out events, specify
--     @autoscaling:EC2_INSTANCE_LAUNCHING@.
--
-- -   To create a lifecycle hook for scale-in events, specify
--     @autoscaling:EC2_INSTANCE_TERMINATING@.
newLifecycleHookSpecification ::
  -- | 'lifecycleHookName'
  Prelude.Text ->
  -- | 'lifecycleTransition'
  Prelude.Text ->
  LifecycleHookSpecification
newLifecycleHookSpecification :: Text -> Text -> LifecycleHookSpecification
newLifecycleHookSpecification
  Text
pLifecycleHookName_
  Text
pLifecycleTransition_ =
    LifecycleHookSpecification'
      { $sel:defaultResult:LifecycleHookSpecification' :: Maybe Text
defaultResult =
          forall a. Maybe a
Prelude.Nothing,
        $sel:heartbeatTimeout:LifecycleHookSpecification' :: Maybe Int
heartbeatTimeout = forall a. Maybe a
Prelude.Nothing,
        $sel:notificationMetadata:LifecycleHookSpecification' :: Maybe Text
notificationMetadata = forall a. Maybe a
Prelude.Nothing,
        $sel:notificationTargetARN:LifecycleHookSpecification' :: Maybe Text
notificationTargetARN = forall a. Maybe a
Prelude.Nothing,
        $sel:roleARN:LifecycleHookSpecification' :: Maybe Text
roleARN = forall a. Maybe a
Prelude.Nothing,
        $sel:lifecycleHookName:LifecycleHookSpecification' :: Text
lifecycleHookName = Text
pLifecycleHookName_,
        $sel:lifecycleTransition:LifecycleHookSpecification' :: Text
lifecycleTransition = Text
pLifecycleTransition_
      }

-- | The action the Auto Scaling group takes when the lifecycle hook timeout
-- elapses or if an unexpected failure occurs. The default value is
-- @ABANDON@.
--
-- Valid values: @CONTINUE@ | @ABANDON@
lifecycleHookSpecification_defaultResult :: Lens.Lens' LifecycleHookSpecification (Prelude.Maybe Prelude.Text)
lifecycleHookSpecification_defaultResult :: Lens' LifecycleHookSpecification (Maybe Text)
lifecycleHookSpecification_defaultResult = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\LifecycleHookSpecification' {Maybe Text
defaultResult :: Maybe Text
$sel:defaultResult:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
defaultResult} -> Maybe Text
defaultResult) (\s :: LifecycleHookSpecification
s@LifecycleHookSpecification' {} Maybe Text
a -> LifecycleHookSpecification
s {$sel:defaultResult:LifecycleHookSpecification' :: Maybe Text
defaultResult = Maybe Text
a} :: LifecycleHookSpecification)

-- | The maximum time, in seconds, that can elapse before the lifecycle hook
-- times out. The range is from @30@ to @7200@ seconds. The default value
-- is @3600@ seconds (1 hour).
lifecycleHookSpecification_heartbeatTimeout :: Lens.Lens' LifecycleHookSpecification (Prelude.Maybe Prelude.Int)
lifecycleHookSpecification_heartbeatTimeout :: Lens' LifecycleHookSpecification (Maybe Int)
lifecycleHookSpecification_heartbeatTimeout = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\LifecycleHookSpecification' {Maybe Int
heartbeatTimeout :: Maybe Int
$sel:heartbeatTimeout:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Int
heartbeatTimeout} -> Maybe Int
heartbeatTimeout) (\s :: LifecycleHookSpecification
s@LifecycleHookSpecification' {} Maybe Int
a -> LifecycleHookSpecification
s {$sel:heartbeatTimeout:LifecycleHookSpecification' :: Maybe Int
heartbeatTimeout = Maybe Int
a} :: LifecycleHookSpecification)

-- | Additional information that you want to include any time Amazon EC2 Auto
-- Scaling sends a message to the notification target.
lifecycleHookSpecification_notificationMetadata :: Lens.Lens' LifecycleHookSpecification (Prelude.Maybe Prelude.Text)
lifecycleHookSpecification_notificationMetadata :: Lens' LifecycleHookSpecification (Maybe Text)
lifecycleHookSpecification_notificationMetadata = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\LifecycleHookSpecification' {Maybe Text
notificationMetadata :: Maybe Text
$sel:notificationMetadata:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
notificationMetadata} -> Maybe Text
notificationMetadata) (\s :: LifecycleHookSpecification
s@LifecycleHookSpecification' {} Maybe Text
a -> LifecycleHookSpecification
s {$sel:notificationMetadata:LifecycleHookSpecification' :: Maybe Text
notificationMetadata = Maybe Text
a} :: LifecycleHookSpecification)

-- | The Amazon Resource Name (ARN) of the notification target that Amazon
-- EC2 Auto Scaling sends notifications to when an instance is in a wait
-- state for the lifecycle hook. You can specify an Amazon SNS topic or an
-- Amazon SQS queue.
lifecycleHookSpecification_notificationTargetARN :: Lens.Lens' LifecycleHookSpecification (Prelude.Maybe Prelude.Text)
lifecycleHookSpecification_notificationTargetARN :: Lens' LifecycleHookSpecification (Maybe Text)
lifecycleHookSpecification_notificationTargetARN = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\LifecycleHookSpecification' {Maybe Text
notificationTargetARN :: Maybe Text
$sel:notificationTargetARN:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
notificationTargetARN} -> Maybe Text
notificationTargetARN) (\s :: LifecycleHookSpecification
s@LifecycleHookSpecification' {} Maybe Text
a -> LifecycleHookSpecification
s {$sel:notificationTargetARN:LifecycleHookSpecification' :: Maybe Text
notificationTargetARN = Maybe Text
a} :: LifecycleHookSpecification)

-- | The ARN of the IAM role that allows the Auto Scaling group to publish to
-- the specified notification target. For information about creating this
-- role, see
-- <https://docs.aws.amazon.com/autoscaling/ec2/userguide/prepare-for-lifecycle-notifications.html#lifecycle-hook-notification-target Configure a notification target for a lifecycle hook>
-- in the /Amazon EC2 Auto Scaling User Guide/.
--
-- Valid only if the notification target is an Amazon SNS topic or an
-- Amazon SQS queue.
lifecycleHookSpecification_roleARN :: Lens.Lens' LifecycleHookSpecification (Prelude.Maybe Prelude.Text)
lifecycleHookSpecification_roleARN :: Lens' LifecycleHookSpecification (Maybe Text)
lifecycleHookSpecification_roleARN = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\LifecycleHookSpecification' {Maybe Text
roleARN :: Maybe Text
$sel:roleARN:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
roleARN} -> Maybe Text
roleARN) (\s :: LifecycleHookSpecification
s@LifecycleHookSpecification' {} Maybe Text
a -> LifecycleHookSpecification
s {$sel:roleARN:LifecycleHookSpecification' :: Maybe Text
roleARN = Maybe Text
a} :: LifecycleHookSpecification)

-- | The name of the lifecycle hook.
lifecycleHookSpecification_lifecycleHookName :: Lens.Lens' LifecycleHookSpecification Prelude.Text
lifecycleHookSpecification_lifecycleHookName :: Lens' LifecycleHookSpecification Text
lifecycleHookSpecification_lifecycleHookName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\LifecycleHookSpecification' {Text
lifecycleHookName :: Text
$sel:lifecycleHookName:LifecycleHookSpecification' :: LifecycleHookSpecification -> Text
lifecycleHookName} -> Text
lifecycleHookName) (\s :: LifecycleHookSpecification
s@LifecycleHookSpecification' {} Text
a -> LifecycleHookSpecification
s {$sel:lifecycleHookName:LifecycleHookSpecification' :: Text
lifecycleHookName = Text
a} :: LifecycleHookSpecification)

-- | The lifecycle transition. For Auto Scaling groups, there are two major
-- lifecycle transitions.
--
-- -   To create a lifecycle hook for scale-out events, specify
--     @autoscaling:EC2_INSTANCE_LAUNCHING@.
--
-- -   To create a lifecycle hook for scale-in events, specify
--     @autoscaling:EC2_INSTANCE_TERMINATING@.
lifecycleHookSpecification_lifecycleTransition :: Lens.Lens' LifecycleHookSpecification Prelude.Text
lifecycleHookSpecification_lifecycleTransition :: Lens' LifecycleHookSpecification Text
lifecycleHookSpecification_lifecycleTransition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\LifecycleHookSpecification' {Text
lifecycleTransition :: Text
$sel:lifecycleTransition:LifecycleHookSpecification' :: LifecycleHookSpecification -> Text
lifecycleTransition} -> Text
lifecycleTransition) (\s :: LifecycleHookSpecification
s@LifecycleHookSpecification' {} Text
a -> LifecycleHookSpecification
s {$sel:lifecycleTransition:LifecycleHookSpecification' :: Text
lifecycleTransition = Text
a} :: LifecycleHookSpecification)

instance Prelude.Hashable LifecycleHookSpecification where
  hashWithSalt :: Int -> LifecycleHookSpecification -> Int
hashWithSalt Int
_salt LifecycleHookSpecification' {Maybe Int
Maybe Text
Text
lifecycleTransition :: Text
lifecycleHookName :: Text
roleARN :: Maybe Text
notificationTargetARN :: Maybe Text
notificationMetadata :: Maybe Text
heartbeatTimeout :: Maybe Int
defaultResult :: Maybe Text
$sel:lifecycleTransition:LifecycleHookSpecification' :: LifecycleHookSpecification -> Text
$sel:lifecycleHookName:LifecycleHookSpecification' :: LifecycleHookSpecification -> Text
$sel:roleARN:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:notificationTargetARN:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:notificationMetadata:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:heartbeatTimeout:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Int
$sel:defaultResult:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
defaultResult
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
heartbeatTimeout
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
notificationMetadata
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
notificationTargetARN
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
roleARN
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
lifecycleHookName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
lifecycleTransition

instance Prelude.NFData LifecycleHookSpecification where
  rnf :: LifecycleHookSpecification -> ()
rnf LifecycleHookSpecification' {Maybe Int
Maybe Text
Text
lifecycleTransition :: Text
lifecycleHookName :: Text
roleARN :: Maybe Text
notificationTargetARN :: Maybe Text
notificationMetadata :: Maybe Text
heartbeatTimeout :: Maybe Int
defaultResult :: Maybe Text
$sel:lifecycleTransition:LifecycleHookSpecification' :: LifecycleHookSpecification -> Text
$sel:lifecycleHookName:LifecycleHookSpecification' :: LifecycleHookSpecification -> Text
$sel:roleARN:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:notificationTargetARN:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:notificationMetadata:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:heartbeatTimeout:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Int
$sel:defaultResult:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
defaultResult
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
heartbeatTimeout
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
notificationMetadata
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
notificationTargetARN
      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 Text
lifecycleHookName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
lifecycleTransition

instance Data.ToQuery LifecycleHookSpecification where
  toQuery :: LifecycleHookSpecification -> QueryString
toQuery LifecycleHookSpecification' {Maybe Int
Maybe Text
Text
lifecycleTransition :: Text
lifecycleHookName :: Text
roleARN :: Maybe Text
notificationTargetARN :: Maybe Text
notificationMetadata :: Maybe Text
heartbeatTimeout :: Maybe Int
defaultResult :: Maybe Text
$sel:lifecycleTransition:LifecycleHookSpecification' :: LifecycleHookSpecification -> Text
$sel:lifecycleHookName:LifecycleHookSpecification' :: LifecycleHookSpecification -> Text
$sel:roleARN:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:notificationTargetARN:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:notificationMetadata:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
$sel:heartbeatTimeout:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Int
$sel:defaultResult:LifecycleHookSpecification' :: LifecycleHookSpecification -> Maybe Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"DefaultResult" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
defaultResult,
        ByteString
"HeartbeatTimeout" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Int
heartbeatTimeout,
        ByteString
"NotificationMetadata" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
notificationMetadata,
        ByteString
"NotificationTargetARN"
          forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
notificationTargetARN,
        ByteString
"RoleARN" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
roleARN,
        ByteString
"LifecycleHookName" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Text
lifecycleHookName,
        ByteString
"LifecycleTransition" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Text
lifecycleTransition
      ]