{-# 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.MigrationHubOrchestrator.UpdateWorkflowStepGroup
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Update the step group in a migration workflow.
module Amazonka.MigrationHubOrchestrator.UpdateWorkflowStepGroup
  ( -- * Creating a Request
    UpdateWorkflowStepGroup (..),
    newUpdateWorkflowStepGroup,

    -- * Request Lenses
    updateWorkflowStepGroup_description,
    updateWorkflowStepGroup_name,
    updateWorkflowStepGroup_next,
    updateWorkflowStepGroup_previous,
    updateWorkflowStepGroup_workflowId,
    updateWorkflowStepGroup_id,

    -- * Destructuring the Response
    UpdateWorkflowStepGroupResponse (..),
    newUpdateWorkflowStepGroupResponse,

    -- * Response Lenses
    updateWorkflowStepGroupResponse_description,
    updateWorkflowStepGroupResponse_id,
    updateWorkflowStepGroupResponse_lastModifiedTime,
    updateWorkflowStepGroupResponse_name,
    updateWorkflowStepGroupResponse_next,
    updateWorkflowStepGroupResponse_previous,
    updateWorkflowStepGroupResponse_tools,
    updateWorkflowStepGroupResponse_workflowId,
    updateWorkflowStepGroupResponse_httpStatus,
  )
where

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

-- | /See:/ 'newUpdateWorkflowStepGroup' smart constructor.
data UpdateWorkflowStepGroup = UpdateWorkflowStepGroup'
  { -- | The description of the step group.
    UpdateWorkflowStepGroup -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | The name of the step group.
    UpdateWorkflowStepGroup -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The next step group.
    UpdateWorkflowStepGroup -> Maybe [Text]
next :: Prelude.Maybe [Prelude.Text],
    -- | The previous step group.
    UpdateWorkflowStepGroup -> Maybe [Text]
previous :: Prelude.Maybe [Prelude.Text],
    -- | The ID of the migration workflow.
    UpdateWorkflowStepGroup -> Text
workflowId :: Prelude.Text,
    -- | The ID of the step group.
    UpdateWorkflowStepGroup -> Text
id :: Prelude.Text
  }
  deriving (UpdateWorkflowStepGroup -> UpdateWorkflowStepGroup -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateWorkflowStepGroup -> UpdateWorkflowStepGroup -> Bool
$c/= :: UpdateWorkflowStepGroup -> UpdateWorkflowStepGroup -> Bool
== :: UpdateWorkflowStepGroup -> UpdateWorkflowStepGroup -> Bool
$c== :: UpdateWorkflowStepGroup -> UpdateWorkflowStepGroup -> Bool
Prelude.Eq, ReadPrec [UpdateWorkflowStepGroup]
ReadPrec UpdateWorkflowStepGroup
Int -> ReadS UpdateWorkflowStepGroup
ReadS [UpdateWorkflowStepGroup]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateWorkflowStepGroup]
$creadListPrec :: ReadPrec [UpdateWorkflowStepGroup]
readPrec :: ReadPrec UpdateWorkflowStepGroup
$creadPrec :: ReadPrec UpdateWorkflowStepGroup
readList :: ReadS [UpdateWorkflowStepGroup]
$creadList :: ReadS [UpdateWorkflowStepGroup]
readsPrec :: Int -> ReadS UpdateWorkflowStepGroup
$creadsPrec :: Int -> ReadS UpdateWorkflowStepGroup
Prelude.Read, Int -> UpdateWorkflowStepGroup -> ShowS
[UpdateWorkflowStepGroup] -> ShowS
UpdateWorkflowStepGroup -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateWorkflowStepGroup] -> ShowS
$cshowList :: [UpdateWorkflowStepGroup] -> ShowS
show :: UpdateWorkflowStepGroup -> String
$cshow :: UpdateWorkflowStepGroup -> String
showsPrec :: Int -> UpdateWorkflowStepGroup -> ShowS
$cshowsPrec :: Int -> UpdateWorkflowStepGroup -> ShowS
Prelude.Show, forall x. Rep UpdateWorkflowStepGroup x -> UpdateWorkflowStepGroup
forall x. UpdateWorkflowStepGroup -> Rep UpdateWorkflowStepGroup x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UpdateWorkflowStepGroup x -> UpdateWorkflowStepGroup
$cfrom :: forall x. UpdateWorkflowStepGroup -> Rep UpdateWorkflowStepGroup x
Prelude.Generic)

-- |
-- Create a value of 'UpdateWorkflowStepGroup' 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:
--
-- 'description', 'updateWorkflowStepGroup_description' - The description of the step group.
--
-- 'name', 'updateWorkflowStepGroup_name' - The name of the step group.
--
-- 'next', 'updateWorkflowStepGroup_next' - The next step group.
--
-- 'previous', 'updateWorkflowStepGroup_previous' - The previous step group.
--
-- 'workflowId', 'updateWorkflowStepGroup_workflowId' - The ID of the migration workflow.
--
-- 'id', 'updateWorkflowStepGroup_id' - The ID of the step group.
newUpdateWorkflowStepGroup ::
  -- | 'workflowId'
  Prelude.Text ->
  -- | 'id'
  Prelude.Text ->
  UpdateWorkflowStepGroup
newUpdateWorkflowStepGroup :: Text -> Text -> UpdateWorkflowStepGroup
newUpdateWorkflowStepGroup Text
pWorkflowId_ Text
pId_ =
  UpdateWorkflowStepGroup'
    { $sel:description:UpdateWorkflowStepGroup' :: Maybe Text
description =
        forall a. Maybe a
Prelude.Nothing,
      $sel:name:UpdateWorkflowStepGroup' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:next:UpdateWorkflowStepGroup' :: Maybe [Text]
next = forall a. Maybe a
Prelude.Nothing,
      $sel:previous:UpdateWorkflowStepGroup' :: Maybe [Text]
previous = forall a. Maybe a
Prelude.Nothing,
      $sel:workflowId:UpdateWorkflowStepGroup' :: Text
workflowId = Text
pWorkflowId_,
      $sel:id:UpdateWorkflowStepGroup' :: Text
id = Text
pId_
    }

-- | The description of the step group.
updateWorkflowStepGroup_description :: Lens.Lens' UpdateWorkflowStepGroup (Prelude.Maybe Prelude.Text)
updateWorkflowStepGroup_description :: Lens' UpdateWorkflowStepGroup (Maybe Text)
updateWorkflowStepGroup_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroup' {Maybe Text
description :: Maybe Text
$sel:description:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
description} -> Maybe Text
description) (\s :: UpdateWorkflowStepGroup
s@UpdateWorkflowStepGroup' {} Maybe Text
a -> UpdateWorkflowStepGroup
s {$sel:description:UpdateWorkflowStepGroup' :: Maybe Text
description = Maybe Text
a} :: UpdateWorkflowStepGroup)

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

-- | The next step group.
updateWorkflowStepGroup_next :: Lens.Lens' UpdateWorkflowStepGroup (Prelude.Maybe [Prelude.Text])
updateWorkflowStepGroup_next :: Lens' UpdateWorkflowStepGroup (Maybe [Text])
updateWorkflowStepGroup_next = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroup' {Maybe [Text]
next :: Maybe [Text]
$sel:next:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
next} -> Maybe [Text]
next) (\s :: UpdateWorkflowStepGroup
s@UpdateWorkflowStepGroup' {} Maybe [Text]
a -> UpdateWorkflowStepGroup
s {$sel:next:UpdateWorkflowStepGroup' :: Maybe [Text]
next = Maybe [Text]
a} :: UpdateWorkflowStepGroup) 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 previous step group.
updateWorkflowStepGroup_previous :: Lens.Lens' UpdateWorkflowStepGroup (Prelude.Maybe [Prelude.Text])
updateWorkflowStepGroup_previous :: Lens' UpdateWorkflowStepGroup (Maybe [Text])
updateWorkflowStepGroup_previous = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroup' {Maybe [Text]
previous :: Maybe [Text]
$sel:previous:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
previous} -> Maybe [Text]
previous) (\s :: UpdateWorkflowStepGroup
s@UpdateWorkflowStepGroup' {} Maybe [Text]
a -> UpdateWorkflowStepGroup
s {$sel:previous:UpdateWorkflowStepGroup' :: Maybe [Text]
previous = Maybe [Text]
a} :: UpdateWorkflowStepGroup) 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 ID of the migration workflow.
updateWorkflowStepGroup_workflowId :: Lens.Lens' UpdateWorkflowStepGroup Prelude.Text
updateWorkflowStepGroup_workflowId :: Lens' UpdateWorkflowStepGroup Text
updateWorkflowStepGroup_workflowId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroup' {Text
workflowId :: Text
$sel:workflowId:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
workflowId} -> Text
workflowId) (\s :: UpdateWorkflowStepGroup
s@UpdateWorkflowStepGroup' {} Text
a -> UpdateWorkflowStepGroup
s {$sel:workflowId:UpdateWorkflowStepGroup' :: Text
workflowId = Text
a} :: UpdateWorkflowStepGroup)

-- | The ID of the step group.
updateWorkflowStepGroup_id :: Lens.Lens' UpdateWorkflowStepGroup Prelude.Text
updateWorkflowStepGroup_id :: Lens' UpdateWorkflowStepGroup Text
updateWorkflowStepGroup_id = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroup' {Text
id :: Text
$sel:id:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
id} -> Text
id) (\s :: UpdateWorkflowStepGroup
s@UpdateWorkflowStepGroup' {} Text
a -> UpdateWorkflowStepGroup
s {$sel:id:UpdateWorkflowStepGroup' :: Text
id = Text
a} :: UpdateWorkflowStepGroup)

instance Core.AWSRequest UpdateWorkflowStepGroup where
  type
    AWSResponse UpdateWorkflowStepGroup =
      UpdateWorkflowStepGroupResponse
  request :: (Service -> Service)
-> UpdateWorkflowStepGroup -> Request UpdateWorkflowStepGroup
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy UpdateWorkflowStepGroup
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse UpdateWorkflowStepGroup)))
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 POSIX
-> Maybe Text
-> Maybe [Text]
-> Maybe [Text]
-> Maybe [Tool]
-> Maybe Text
-> Int
-> UpdateWorkflowStepGroupResponse
UpdateWorkflowStepGroupResponse'
            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
"description")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"id")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"lastModifiedTime")
            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
"next" 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
"previous" 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
"tools" 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
"workflowId")
            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 UpdateWorkflowStepGroup where
  hashWithSalt :: Int -> UpdateWorkflowStepGroup -> Int
hashWithSalt Int
_salt UpdateWorkflowStepGroup' {Maybe [Text]
Maybe Text
Text
id :: Text
workflowId :: Text
previous :: Maybe [Text]
next :: Maybe [Text]
name :: Maybe Text
description :: Maybe Text
$sel:id:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:workflowId:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:previous:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:next:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:name:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
$sel:description:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
description
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
name
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
next
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
previous
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
workflowId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
id

instance Prelude.NFData UpdateWorkflowStepGroup where
  rnf :: UpdateWorkflowStepGroup -> ()
rnf UpdateWorkflowStepGroup' {Maybe [Text]
Maybe Text
Text
id :: Text
workflowId :: Text
previous :: Maybe [Text]
next :: Maybe [Text]
name :: Maybe Text
description :: Maybe Text
$sel:id:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:workflowId:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:previous:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:next:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:name:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
$sel:description:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
next
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
previous
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
workflowId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
id

instance Data.ToHeaders UpdateWorkflowStepGroup where
  toHeaders :: UpdateWorkflowStepGroup -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON UpdateWorkflowStepGroup where
  toJSON :: UpdateWorkflowStepGroup -> Value
toJSON UpdateWorkflowStepGroup' {Maybe [Text]
Maybe Text
Text
id :: Text
workflowId :: Text
previous :: Maybe [Text]
next :: Maybe [Text]
name :: Maybe Text
description :: Maybe Text
$sel:id:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:workflowId:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:previous:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:next:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:name:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
$sel:description:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"description" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
description,
            (Key
"name" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
name,
            (Key
"next" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Text]
next,
            (Key
"previous" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Text]
previous
          ]
      )

instance Data.ToPath UpdateWorkflowStepGroup where
  toPath :: UpdateWorkflowStepGroup -> ByteString
toPath UpdateWorkflowStepGroup' {Maybe [Text]
Maybe Text
Text
id :: Text
workflowId :: Text
previous :: Maybe [Text]
next :: Maybe [Text]
name :: Maybe Text
description :: Maybe Text
$sel:id:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:workflowId:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:previous:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:next:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:name:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
$sel:description:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ByteString
"/workflowstepgroup/", forall a. ToByteString a => a -> ByteString
Data.toBS Text
id]

instance Data.ToQuery UpdateWorkflowStepGroup where
  toQuery :: UpdateWorkflowStepGroup -> QueryString
toQuery UpdateWorkflowStepGroup' {Maybe [Text]
Maybe Text
Text
id :: Text
workflowId :: Text
previous :: Maybe [Text]
next :: Maybe [Text]
name :: Maybe Text
description :: Maybe Text
$sel:id:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:workflowId:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Text
$sel:previous:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:next:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe [Text]
$sel:name:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
$sel:description:UpdateWorkflowStepGroup' :: UpdateWorkflowStepGroup -> Maybe Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat [ByteString
"workflowId" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Text
workflowId]

-- | /See:/ 'newUpdateWorkflowStepGroupResponse' smart constructor.
data UpdateWorkflowStepGroupResponse = UpdateWorkflowStepGroupResponse'
  { -- | The description of the step group.
    UpdateWorkflowStepGroupResponse -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | The ID of the step group.
    UpdateWorkflowStepGroupResponse -> Maybe Text
id :: Prelude.Maybe Prelude.Text,
    -- | The time at which the step group was last modified.
    UpdateWorkflowStepGroupResponse -> Maybe POSIX
lastModifiedTime :: Prelude.Maybe Data.POSIX,
    -- | The name of the step group.
    UpdateWorkflowStepGroupResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The next step group.
    UpdateWorkflowStepGroupResponse -> Maybe [Text]
next :: Prelude.Maybe [Prelude.Text],
    -- | The previous step group.
    UpdateWorkflowStepGroupResponse -> Maybe [Text]
previous :: Prelude.Maybe [Prelude.Text],
    -- | List of AWS services utilized in a migration workflow.
    UpdateWorkflowStepGroupResponse -> Maybe [Tool]
tools :: Prelude.Maybe [Tool],
    -- | The ID of the migration workflow.
    UpdateWorkflowStepGroupResponse -> Maybe Text
workflowId :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    UpdateWorkflowStepGroupResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (UpdateWorkflowStepGroupResponse
-> UpdateWorkflowStepGroupResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateWorkflowStepGroupResponse
-> UpdateWorkflowStepGroupResponse -> Bool
$c/= :: UpdateWorkflowStepGroupResponse
-> UpdateWorkflowStepGroupResponse -> Bool
== :: UpdateWorkflowStepGroupResponse
-> UpdateWorkflowStepGroupResponse -> Bool
$c== :: UpdateWorkflowStepGroupResponse
-> UpdateWorkflowStepGroupResponse -> Bool
Prelude.Eq, ReadPrec [UpdateWorkflowStepGroupResponse]
ReadPrec UpdateWorkflowStepGroupResponse
Int -> ReadS UpdateWorkflowStepGroupResponse
ReadS [UpdateWorkflowStepGroupResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateWorkflowStepGroupResponse]
$creadListPrec :: ReadPrec [UpdateWorkflowStepGroupResponse]
readPrec :: ReadPrec UpdateWorkflowStepGroupResponse
$creadPrec :: ReadPrec UpdateWorkflowStepGroupResponse
readList :: ReadS [UpdateWorkflowStepGroupResponse]
$creadList :: ReadS [UpdateWorkflowStepGroupResponse]
readsPrec :: Int -> ReadS UpdateWorkflowStepGroupResponse
$creadsPrec :: Int -> ReadS UpdateWorkflowStepGroupResponse
Prelude.Read, Int -> UpdateWorkflowStepGroupResponse -> ShowS
[UpdateWorkflowStepGroupResponse] -> ShowS
UpdateWorkflowStepGroupResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateWorkflowStepGroupResponse] -> ShowS
$cshowList :: [UpdateWorkflowStepGroupResponse] -> ShowS
show :: UpdateWorkflowStepGroupResponse -> String
$cshow :: UpdateWorkflowStepGroupResponse -> String
showsPrec :: Int -> UpdateWorkflowStepGroupResponse -> ShowS
$cshowsPrec :: Int -> UpdateWorkflowStepGroupResponse -> ShowS
Prelude.Show, forall x.
Rep UpdateWorkflowStepGroupResponse x
-> UpdateWorkflowStepGroupResponse
forall x.
UpdateWorkflowStepGroupResponse
-> Rep UpdateWorkflowStepGroupResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep UpdateWorkflowStepGroupResponse x
-> UpdateWorkflowStepGroupResponse
$cfrom :: forall x.
UpdateWorkflowStepGroupResponse
-> Rep UpdateWorkflowStepGroupResponse x
Prelude.Generic)

-- |
-- Create a value of 'UpdateWorkflowStepGroupResponse' 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:
--
-- 'description', 'updateWorkflowStepGroupResponse_description' - The description of the step group.
--
-- 'id', 'updateWorkflowStepGroupResponse_id' - The ID of the step group.
--
-- 'lastModifiedTime', 'updateWorkflowStepGroupResponse_lastModifiedTime' - The time at which the step group was last modified.
--
-- 'name', 'updateWorkflowStepGroupResponse_name' - The name of the step group.
--
-- 'next', 'updateWorkflowStepGroupResponse_next' - The next step group.
--
-- 'previous', 'updateWorkflowStepGroupResponse_previous' - The previous step group.
--
-- 'tools', 'updateWorkflowStepGroupResponse_tools' - List of AWS services utilized in a migration workflow.
--
-- 'workflowId', 'updateWorkflowStepGroupResponse_workflowId' - The ID of the migration workflow.
--
-- 'httpStatus', 'updateWorkflowStepGroupResponse_httpStatus' - The response's http status code.
newUpdateWorkflowStepGroupResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  UpdateWorkflowStepGroupResponse
newUpdateWorkflowStepGroupResponse :: Int -> UpdateWorkflowStepGroupResponse
newUpdateWorkflowStepGroupResponse Int
pHttpStatus_ =
  UpdateWorkflowStepGroupResponse'
    { $sel:description:UpdateWorkflowStepGroupResponse' :: Maybe Text
description =
        forall a. Maybe a
Prelude.Nothing,
      $sel:id:UpdateWorkflowStepGroupResponse' :: Maybe Text
id = forall a. Maybe a
Prelude.Nothing,
      $sel:lastModifiedTime:UpdateWorkflowStepGroupResponse' :: Maybe POSIX
lastModifiedTime = forall a. Maybe a
Prelude.Nothing,
      $sel:name:UpdateWorkflowStepGroupResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:next:UpdateWorkflowStepGroupResponse' :: Maybe [Text]
next = forall a. Maybe a
Prelude.Nothing,
      $sel:previous:UpdateWorkflowStepGroupResponse' :: Maybe [Text]
previous = forall a. Maybe a
Prelude.Nothing,
      $sel:tools:UpdateWorkflowStepGroupResponse' :: Maybe [Tool]
tools = forall a. Maybe a
Prelude.Nothing,
      $sel:workflowId:UpdateWorkflowStepGroupResponse' :: Maybe Text
workflowId = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:UpdateWorkflowStepGroupResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The description of the step group.
updateWorkflowStepGroupResponse_description :: Lens.Lens' UpdateWorkflowStepGroupResponse (Prelude.Maybe Prelude.Text)
updateWorkflowStepGroupResponse_description :: Lens' UpdateWorkflowStepGroupResponse (Maybe Text)
updateWorkflowStepGroupResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroupResponse' {Maybe Text
description :: Maybe Text
$sel:description:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: UpdateWorkflowStepGroupResponse
s@UpdateWorkflowStepGroupResponse' {} Maybe Text
a -> UpdateWorkflowStepGroupResponse
s {$sel:description:UpdateWorkflowStepGroupResponse' :: Maybe Text
description = Maybe Text
a} :: UpdateWorkflowStepGroupResponse)

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

-- | The time at which the step group was last modified.
updateWorkflowStepGroupResponse_lastModifiedTime :: Lens.Lens' UpdateWorkflowStepGroupResponse (Prelude.Maybe Prelude.UTCTime)
updateWorkflowStepGroupResponse_lastModifiedTime :: Lens' UpdateWorkflowStepGroupResponse (Maybe UTCTime)
updateWorkflowStepGroupResponse_lastModifiedTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroupResponse' {Maybe POSIX
lastModifiedTime :: Maybe POSIX
$sel:lastModifiedTime:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe POSIX
lastModifiedTime} -> Maybe POSIX
lastModifiedTime) (\s :: UpdateWorkflowStepGroupResponse
s@UpdateWorkflowStepGroupResponse' {} Maybe POSIX
a -> UpdateWorkflowStepGroupResponse
s {$sel:lastModifiedTime:UpdateWorkflowStepGroupResponse' :: Maybe POSIX
lastModifiedTime = Maybe POSIX
a} :: UpdateWorkflowStepGroupResponse) 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 (a :: Format). Iso' (Time a) UTCTime
Data._Time

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

-- | The next step group.
updateWorkflowStepGroupResponse_next :: Lens.Lens' UpdateWorkflowStepGroupResponse (Prelude.Maybe [Prelude.Text])
updateWorkflowStepGroupResponse_next :: Lens' UpdateWorkflowStepGroupResponse (Maybe [Text])
updateWorkflowStepGroupResponse_next = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroupResponse' {Maybe [Text]
next :: Maybe [Text]
$sel:next:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe [Text]
next} -> Maybe [Text]
next) (\s :: UpdateWorkflowStepGroupResponse
s@UpdateWorkflowStepGroupResponse' {} Maybe [Text]
a -> UpdateWorkflowStepGroupResponse
s {$sel:next:UpdateWorkflowStepGroupResponse' :: Maybe [Text]
next = Maybe [Text]
a} :: UpdateWorkflowStepGroupResponse) 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 previous step group.
updateWorkflowStepGroupResponse_previous :: Lens.Lens' UpdateWorkflowStepGroupResponse (Prelude.Maybe [Prelude.Text])
updateWorkflowStepGroupResponse_previous :: Lens' UpdateWorkflowStepGroupResponse (Maybe [Text])
updateWorkflowStepGroupResponse_previous = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroupResponse' {Maybe [Text]
previous :: Maybe [Text]
$sel:previous:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe [Text]
previous} -> Maybe [Text]
previous) (\s :: UpdateWorkflowStepGroupResponse
s@UpdateWorkflowStepGroupResponse' {} Maybe [Text]
a -> UpdateWorkflowStepGroupResponse
s {$sel:previous:UpdateWorkflowStepGroupResponse' :: Maybe [Text]
previous = Maybe [Text]
a} :: UpdateWorkflowStepGroupResponse) 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

-- | List of AWS services utilized in a migration workflow.
updateWorkflowStepGroupResponse_tools :: Lens.Lens' UpdateWorkflowStepGroupResponse (Prelude.Maybe [Tool])
updateWorkflowStepGroupResponse_tools :: Lens' UpdateWorkflowStepGroupResponse (Maybe [Tool])
updateWorkflowStepGroupResponse_tools = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroupResponse' {Maybe [Tool]
tools :: Maybe [Tool]
$sel:tools:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe [Tool]
tools} -> Maybe [Tool]
tools) (\s :: UpdateWorkflowStepGroupResponse
s@UpdateWorkflowStepGroupResponse' {} Maybe [Tool]
a -> UpdateWorkflowStepGroupResponse
s {$sel:tools:UpdateWorkflowStepGroupResponse' :: Maybe [Tool]
tools = Maybe [Tool]
a} :: UpdateWorkflowStepGroupResponse) 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 ID of the migration workflow.
updateWorkflowStepGroupResponse_workflowId :: Lens.Lens' UpdateWorkflowStepGroupResponse (Prelude.Maybe Prelude.Text)
updateWorkflowStepGroupResponse_workflowId :: Lens' UpdateWorkflowStepGroupResponse (Maybe Text)
updateWorkflowStepGroupResponse_workflowId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateWorkflowStepGroupResponse' {Maybe Text
workflowId :: Maybe Text
$sel:workflowId:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe Text
workflowId} -> Maybe Text
workflowId) (\s :: UpdateWorkflowStepGroupResponse
s@UpdateWorkflowStepGroupResponse' {} Maybe Text
a -> UpdateWorkflowStepGroupResponse
s {$sel:workflowId:UpdateWorkflowStepGroupResponse' :: Maybe Text
workflowId = Maybe Text
a} :: UpdateWorkflowStepGroupResponse)

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

instance
  Prelude.NFData
    UpdateWorkflowStepGroupResponse
  where
  rnf :: UpdateWorkflowStepGroupResponse -> ()
rnf UpdateWorkflowStepGroupResponse' {Int
Maybe [Text]
Maybe [Tool]
Maybe Text
Maybe POSIX
httpStatus :: Int
workflowId :: Maybe Text
tools :: Maybe [Tool]
previous :: Maybe [Text]
next :: Maybe [Text]
name :: Maybe Text
lastModifiedTime :: Maybe POSIX
id :: Maybe Text
description :: Maybe Text
$sel:httpStatus:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Int
$sel:workflowId:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe Text
$sel:tools:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe [Tool]
$sel:previous:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe [Text]
$sel:next:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe [Text]
$sel:name:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe Text
$sel:lastModifiedTime:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe POSIX
$sel:id:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe Text
$sel:description:UpdateWorkflowStepGroupResponse' :: UpdateWorkflowStepGroupResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
id
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
lastModifiedTime
      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]
next
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
previous
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Tool]
tools
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
workflowId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus