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

    -- * Request Lenses
    createWorkflowStepGroup_description,
    createWorkflowStepGroup_next,
    createWorkflowStepGroup_previous,
    createWorkflowStepGroup_workflowId,
    createWorkflowStepGroup_name,

    -- * Destructuring the Response
    CreateWorkflowStepGroupResponse (..),
    newCreateWorkflowStepGroupResponse,

    -- * Response Lenses
    createWorkflowStepGroupResponse_creationTime,
    createWorkflowStepGroupResponse_description,
    createWorkflowStepGroupResponse_id,
    createWorkflowStepGroupResponse_name,
    createWorkflowStepGroupResponse_next,
    createWorkflowStepGroupResponse_previous,
    createWorkflowStepGroupResponse_tools,
    createWorkflowStepGroupResponse_workflowId,
    createWorkflowStepGroupResponse_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:/ 'newCreateWorkflowStepGroup' smart constructor.
data CreateWorkflowStepGroup = CreateWorkflowStepGroup'
  { -- | The description of the step group.
    CreateWorkflowStepGroup -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | The next step group.
    CreateWorkflowStepGroup -> Maybe [Text]
next :: Prelude.Maybe [Prelude.Text],
    -- | The previous step group.
    CreateWorkflowStepGroup -> Maybe [Text]
previous :: Prelude.Maybe [Prelude.Text],
    -- | The ID of the migration workflow that will contain the step group.
    CreateWorkflowStepGroup -> Text
workflowId :: Prelude.Text,
    -- | The name of the step group.
    CreateWorkflowStepGroup -> Text
name :: Prelude.Text
  }
  deriving (CreateWorkflowStepGroup -> CreateWorkflowStepGroup -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CreateWorkflowStepGroup -> CreateWorkflowStepGroup -> Bool
$c/= :: CreateWorkflowStepGroup -> CreateWorkflowStepGroup -> Bool
== :: CreateWorkflowStepGroup -> CreateWorkflowStepGroup -> Bool
$c== :: CreateWorkflowStepGroup -> CreateWorkflowStepGroup -> Bool
Prelude.Eq, ReadPrec [CreateWorkflowStepGroup]
ReadPrec CreateWorkflowStepGroup
Int -> ReadS CreateWorkflowStepGroup
ReadS [CreateWorkflowStepGroup]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CreateWorkflowStepGroup]
$creadListPrec :: ReadPrec [CreateWorkflowStepGroup]
readPrec :: ReadPrec CreateWorkflowStepGroup
$creadPrec :: ReadPrec CreateWorkflowStepGroup
readList :: ReadS [CreateWorkflowStepGroup]
$creadList :: ReadS [CreateWorkflowStepGroup]
readsPrec :: Int -> ReadS CreateWorkflowStepGroup
$creadsPrec :: Int -> ReadS CreateWorkflowStepGroup
Prelude.Read, Int -> CreateWorkflowStepGroup -> ShowS
[CreateWorkflowStepGroup] -> ShowS
CreateWorkflowStepGroup -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CreateWorkflowStepGroup] -> ShowS
$cshowList :: [CreateWorkflowStepGroup] -> ShowS
show :: CreateWorkflowStepGroup -> String
$cshow :: CreateWorkflowStepGroup -> String
showsPrec :: Int -> CreateWorkflowStepGroup -> ShowS
$cshowsPrec :: Int -> CreateWorkflowStepGroup -> ShowS
Prelude.Show, forall x. Rep CreateWorkflowStepGroup x -> CreateWorkflowStepGroup
forall x. CreateWorkflowStepGroup -> Rep CreateWorkflowStepGroup x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep CreateWorkflowStepGroup x -> CreateWorkflowStepGroup
$cfrom :: forall x. CreateWorkflowStepGroup -> Rep CreateWorkflowStepGroup x
Prelude.Generic)

-- |
-- Create a value of 'CreateWorkflowStepGroup' 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', 'createWorkflowStepGroup_description' - The description of the step group.
--
-- 'next', 'createWorkflowStepGroup_next' - The next step group.
--
-- 'previous', 'createWorkflowStepGroup_previous' - The previous step group.
--
-- 'workflowId', 'createWorkflowStepGroup_workflowId' - The ID of the migration workflow that will contain the step group.
--
-- 'name', 'createWorkflowStepGroup_name' - The name of the step group.
newCreateWorkflowStepGroup ::
  -- | 'workflowId'
  Prelude.Text ->
  -- | 'name'
  Prelude.Text ->
  CreateWorkflowStepGroup
newCreateWorkflowStepGroup :: Text -> Text -> CreateWorkflowStepGroup
newCreateWorkflowStepGroup Text
pWorkflowId_ Text
pName_ =
  CreateWorkflowStepGroup'
    { $sel:description:CreateWorkflowStepGroup' :: Maybe Text
description =
        forall a. Maybe a
Prelude.Nothing,
      $sel:next:CreateWorkflowStepGroup' :: Maybe [Text]
next = forall a. Maybe a
Prelude.Nothing,
      $sel:previous:CreateWorkflowStepGroup' :: Maybe [Text]
previous = forall a. Maybe a
Prelude.Nothing,
      $sel:workflowId:CreateWorkflowStepGroup' :: Text
workflowId = Text
pWorkflowId_,
      $sel:name:CreateWorkflowStepGroup' :: Text
name = Text
pName_
    }

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

-- | The next step group.
createWorkflowStepGroup_next :: Lens.Lens' CreateWorkflowStepGroup (Prelude.Maybe [Prelude.Text])
createWorkflowStepGroup_next :: Lens' CreateWorkflowStepGroup (Maybe [Text])
createWorkflowStepGroup_next = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroup' {Maybe [Text]
next :: Maybe [Text]
$sel:next:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Maybe [Text]
next} -> Maybe [Text]
next) (\s :: CreateWorkflowStepGroup
s@CreateWorkflowStepGroup' {} Maybe [Text]
a -> CreateWorkflowStepGroup
s {$sel:next:CreateWorkflowStepGroup' :: Maybe [Text]
next = Maybe [Text]
a} :: CreateWorkflowStepGroup) 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.
createWorkflowStepGroup_previous :: Lens.Lens' CreateWorkflowStepGroup (Prelude.Maybe [Prelude.Text])
createWorkflowStepGroup_previous :: Lens' CreateWorkflowStepGroup (Maybe [Text])
createWorkflowStepGroup_previous = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroup' {Maybe [Text]
previous :: Maybe [Text]
$sel:previous:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Maybe [Text]
previous} -> Maybe [Text]
previous) (\s :: CreateWorkflowStepGroup
s@CreateWorkflowStepGroup' {} Maybe [Text]
a -> CreateWorkflowStepGroup
s {$sel:previous:CreateWorkflowStepGroup' :: Maybe [Text]
previous = Maybe [Text]
a} :: CreateWorkflowStepGroup) 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 that will contain the step group.
createWorkflowStepGroup_workflowId :: Lens.Lens' CreateWorkflowStepGroup Prelude.Text
createWorkflowStepGroup_workflowId :: Lens' CreateWorkflowStepGroup Text
createWorkflowStepGroup_workflowId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroup' {Text
workflowId :: Text
$sel:workflowId:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Text
workflowId} -> Text
workflowId) (\s :: CreateWorkflowStepGroup
s@CreateWorkflowStepGroup' {} Text
a -> CreateWorkflowStepGroup
s {$sel:workflowId:CreateWorkflowStepGroup' :: Text
workflowId = Text
a} :: CreateWorkflowStepGroup)

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

instance Core.AWSRequest CreateWorkflowStepGroup where
  type
    AWSResponse CreateWorkflowStepGroup =
      CreateWorkflowStepGroupResponse
  request :: (Service -> Service)
-> CreateWorkflowStepGroup -> Request CreateWorkflowStepGroup
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 CreateWorkflowStepGroup
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse CreateWorkflowStepGroup)))
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 POSIX
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe [Text]
-> Maybe [Text]
-> Maybe [Tool]
-> Maybe Text
-> Int
-> CreateWorkflowStepGroupResponse
CreateWorkflowStepGroupResponse'
            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
"creationTime")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"description")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"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
"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 CreateWorkflowStepGroup where
  hashWithSalt :: Int -> CreateWorkflowStepGroup -> Int
hashWithSalt Int
_salt CreateWorkflowStepGroup' {Maybe [Text]
Maybe Text
Text
name :: Text
workflowId :: Text
previous :: Maybe [Text]
next :: Maybe [Text]
description :: Maybe Text
$sel:name:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Text
$sel:workflowId:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Text
$sel:previous:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Maybe [Text]
$sel:next:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Maybe [Text]
$sel:description:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> 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]
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
name

instance Prelude.NFData CreateWorkflowStepGroup where
  rnf :: CreateWorkflowStepGroup -> ()
rnf CreateWorkflowStepGroup' {Maybe [Text]
Maybe Text
Text
name :: Text
workflowId :: Text
previous :: Maybe [Text]
next :: Maybe [Text]
description :: Maybe Text
$sel:name:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Text
$sel:workflowId:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Text
$sel:previous:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Maybe [Text]
$sel:next:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Maybe [Text]
$sel:description:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> 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]
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
name

instance Data.ToHeaders CreateWorkflowStepGroup where
  toHeaders :: CreateWorkflowStepGroup -> 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 CreateWorkflowStepGroup where
  toJSON :: CreateWorkflowStepGroup -> Value
toJSON CreateWorkflowStepGroup' {Maybe [Text]
Maybe Text
Text
name :: Text
workflowId :: Text
previous :: Maybe [Text]
next :: Maybe [Text]
description :: Maybe Text
$sel:name:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Text
$sel:workflowId:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Text
$sel:previous:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Maybe [Text]
$sel:next:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> Maybe [Text]
$sel:description:CreateWorkflowStepGroup' :: CreateWorkflowStepGroup -> 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
"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,
            forall a. a -> Maybe a
Prelude.Just (Key
"workflowId" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
workflowId),
            forall a. a -> Maybe a
Prelude.Just (Key
"name" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
name)
          ]
      )

instance Data.ToPath CreateWorkflowStepGroup where
  toPath :: CreateWorkflowStepGroup -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/workflowstepgroups"

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

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

-- |
-- Create a value of 'CreateWorkflowStepGroupResponse' 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:
--
-- 'creationTime', 'createWorkflowStepGroupResponse_creationTime' - The time at which the step group is created.
--
-- 'description', 'createWorkflowStepGroupResponse_description' - The description of the step group.
--
-- 'id', 'createWorkflowStepGroupResponse_id' - The ID of the step group.
--
-- 'name', 'createWorkflowStepGroupResponse_name' - The name of the step group.
--
-- 'next', 'createWorkflowStepGroupResponse_next' - The next step group.
--
-- 'previous', 'createWorkflowStepGroupResponse_previous' - The previous step group.
--
-- 'tools', 'createWorkflowStepGroupResponse_tools' - List of AWS services utilized in a migration workflow.
--
-- 'workflowId', 'createWorkflowStepGroupResponse_workflowId' - The ID of the migration workflow that contains the step group.
--
-- 'httpStatus', 'createWorkflowStepGroupResponse_httpStatus' - The response's http status code.
newCreateWorkflowStepGroupResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  CreateWorkflowStepGroupResponse
newCreateWorkflowStepGroupResponse :: Int -> CreateWorkflowStepGroupResponse
newCreateWorkflowStepGroupResponse Int
pHttpStatus_ =
  CreateWorkflowStepGroupResponse'
    { $sel:creationTime:CreateWorkflowStepGroupResponse' :: Maybe POSIX
creationTime =
        forall a. Maybe a
Prelude.Nothing,
      $sel:description:CreateWorkflowStepGroupResponse' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:id:CreateWorkflowStepGroupResponse' :: Maybe Text
id = forall a. Maybe a
Prelude.Nothing,
      $sel:name:CreateWorkflowStepGroupResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:next:CreateWorkflowStepGroupResponse' :: Maybe [Text]
next = forall a. Maybe a
Prelude.Nothing,
      $sel:previous:CreateWorkflowStepGroupResponse' :: Maybe [Text]
previous = forall a. Maybe a
Prelude.Nothing,
      $sel:tools:CreateWorkflowStepGroupResponse' :: Maybe [Tool]
tools = forall a. Maybe a
Prelude.Nothing,
      $sel:workflowId:CreateWorkflowStepGroupResponse' :: Maybe Text
workflowId = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:CreateWorkflowStepGroupResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The time at which the step group is created.
createWorkflowStepGroupResponse_creationTime :: Lens.Lens' CreateWorkflowStepGroupResponse (Prelude.Maybe Prelude.UTCTime)
createWorkflowStepGroupResponse_creationTime :: Lens' CreateWorkflowStepGroupResponse (Maybe UTCTime)
createWorkflowStepGroupResponse_creationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroupResponse' {Maybe POSIX
creationTime :: Maybe POSIX
$sel:creationTime:CreateWorkflowStepGroupResponse' :: CreateWorkflowStepGroupResponse -> Maybe POSIX
creationTime} -> Maybe POSIX
creationTime) (\s :: CreateWorkflowStepGroupResponse
s@CreateWorkflowStepGroupResponse' {} Maybe POSIX
a -> CreateWorkflowStepGroupResponse
s {$sel:creationTime:CreateWorkflowStepGroupResponse' :: Maybe POSIX
creationTime = Maybe POSIX
a} :: CreateWorkflowStepGroupResponse) 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 description of the step group.
createWorkflowStepGroupResponse_description :: Lens.Lens' CreateWorkflowStepGroupResponse (Prelude.Maybe Prelude.Text)
createWorkflowStepGroupResponse_description :: Lens' CreateWorkflowStepGroupResponse (Maybe Text)
createWorkflowStepGroupResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroupResponse' {Maybe Text
description :: Maybe Text
$sel:description:CreateWorkflowStepGroupResponse' :: CreateWorkflowStepGroupResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: CreateWorkflowStepGroupResponse
s@CreateWorkflowStepGroupResponse' {} Maybe Text
a -> CreateWorkflowStepGroupResponse
s {$sel:description:CreateWorkflowStepGroupResponse' :: Maybe Text
description = Maybe Text
a} :: CreateWorkflowStepGroupResponse)

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

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

-- | The next step group.
createWorkflowStepGroupResponse_next :: Lens.Lens' CreateWorkflowStepGroupResponse (Prelude.Maybe [Prelude.Text])
createWorkflowStepGroupResponse_next :: Lens' CreateWorkflowStepGroupResponse (Maybe [Text])
createWorkflowStepGroupResponse_next = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroupResponse' {Maybe [Text]
next :: Maybe [Text]
$sel:next:CreateWorkflowStepGroupResponse' :: CreateWorkflowStepGroupResponse -> Maybe [Text]
next} -> Maybe [Text]
next) (\s :: CreateWorkflowStepGroupResponse
s@CreateWorkflowStepGroupResponse' {} Maybe [Text]
a -> CreateWorkflowStepGroupResponse
s {$sel:next:CreateWorkflowStepGroupResponse' :: Maybe [Text]
next = Maybe [Text]
a} :: CreateWorkflowStepGroupResponse) 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.
createWorkflowStepGroupResponse_previous :: Lens.Lens' CreateWorkflowStepGroupResponse (Prelude.Maybe [Prelude.Text])
createWorkflowStepGroupResponse_previous :: Lens' CreateWorkflowStepGroupResponse (Maybe [Text])
createWorkflowStepGroupResponse_previous = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroupResponse' {Maybe [Text]
previous :: Maybe [Text]
$sel:previous:CreateWorkflowStepGroupResponse' :: CreateWorkflowStepGroupResponse -> Maybe [Text]
previous} -> Maybe [Text]
previous) (\s :: CreateWorkflowStepGroupResponse
s@CreateWorkflowStepGroupResponse' {} Maybe [Text]
a -> CreateWorkflowStepGroupResponse
s {$sel:previous:CreateWorkflowStepGroupResponse' :: Maybe [Text]
previous = Maybe [Text]
a} :: CreateWorkflowStepGroupResponse) 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.
createWorkflowStepGroupResponse_tools :: Lens.Lens' CreateWorkflowStepGroupResponse (Prelude.Maybe [Tool])
createWorkflowStepGroupResponse_tools :: Lens' CreateWorkflowStepGroupResponse (Maybe [Tool])
createWorkflowStepGroupResponse_tools = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroupResponse' {Maybe [Tool]
tools :: Maybe [Tool]
$sel:tools:CreateWorkflowStepGroupResponse' :: CreateWorkflowStepGroupResponse -> Maybe [Tool]
tools} -> Maybe [Tool]
tools) (\s :: CreateWorkflowStepGroupResponse
s@CreateWorkflowStepGroupResponse' {} Maybe [Tool]
a -> CreateWorkflowStepGroupResponse
s {$sel:tools:CreateWorkflowStepGroupResponse' :: Maybe [Tool]
tools = Maybe [Tool]
a} :: CreateWorkflowStepGroupResponse) 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 that contains the step group.
createWorkflowStepGroupResponse_workflowId :: Lens.Lens' CreateWorkflowStepGroupResponse (Prelude.Maybe Prelude.Text)
createWorkflowStepGroupResponse_workflowId :: Lens' CreateWorkflowStepGroupResponse (Maybe Text)
createWorkflowStepGroupResponse_workflowId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateWorkflowStepGroupResponse' {Maybe Text
workflowId :: Maybe Text
$sel:workflowId:CreateWorkflowStepGroupResponse' :: CreateWorkflowStepGroupResponse -> Maybe Text
workflowId} -> Maybe Text
workflowId) (\s :: CreateWorkflowStepGroupResponse
s@CreateWorkflowStepGroupResponse' {} Maybe Text
a -> CreateWorkflowStepGroupResponse
s {$sel:workflowId:CreateWorkflowStepGroupResponse' :: Maybe Text
workflowId = Maybe Text
a} :: CreateWorkflowStepGroupResponse)

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

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