{-# 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.MemoryDb.CreateParameterGroup
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Creates a new MemoryDB parameter group. A parameter group is a
-- collection of parameters and their values that are applied to all of the
-- nodes in any cluster. For more information, see
-- <https://docs.aws.amazon.com/MemoryDB/latest/devguide/parametergroups.html Configuring engine parameters using parameter groups>.
module Amazonka.MemoryDb.CreateParameterGroup
  ( -- * Creating a Request
    CreateParameterGroup (..),
    newCreateParameterGroup,

    -- * Request Lenses
    createParameterGroup_description,
    createParameterGroup_tags,
    createParameterGroup_parameterGroupName,
    createParameterGroup_family,

    -- * Destructuring the Response
    CreateParameterGroupResponse (..),
    newCreateParameterGroupResponse,

    -- * Response Lenses
    createParameterGroupResponse_parameterGroup,
    createParameterGroupResponse_httpStatus,
  )
where

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

-- | /See:/ 'newCreateParameterGroup' smart constructor.
data CreateParameterGroup = CreateParameterGroup'
  { -- | An optional description of the parameter group.
    CreateParameterGroup -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | A list of tags to be added to this resource. A tag is a key-value pair.
    -- A tag key must be accompanied by a tag value, although null is accepted.
    CreateParameterGroup -> Maybe [Tag]
tags :: Prelude.Maybe [Tag],
    -- | The name of the parameter group.
    CreateParameterGroup -> Text
parameterGroupName :: Prelude.Text,
    -- | The name of the parameter group family that the parameter group can be
    -- used with.
    CreateParameterGroup -> Text
family :: Prelude.Text
  }
  deriving (CreateParameterGroup -> CreateParameterGroup -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CreateParameterGroup -> CreateParameterGroup -> Bool
$c/= :: CreateParameterGroup -> CreateParameterGroup -> Bool
== :: CreateParameterGroup -> CreateParameterGroup -> Bool
$c== :: CreateParameterGroup -> CreateParameterGroup -> Bool
Prelude.Eq, ReadPrec [CreateParameterGroup]
ReadPrec CreateParameterGroup
Int -> ReadS CreateParameterGroup
ReadS [CreateParameterGroup]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CreateParameterGroup]
$creadListPrec :: ReadPrec [CreateParameterGroup]
readPrec :: ReadPrec CreateParameterGroup
$creadPrec :: ReadPrec CreateParameterGroup
readList :: ReadS [CreateParameterGroup]
$creadList :: ReadS [CreateParameterGroup]
readsPrec :: Int -> ReadS CreateParameterGroup
$creadsPrec :: Int -> ReadS CreateParameterGroup
Prelude.Read, Int -> CreateParameterGroup -> ShowS
[CreateParameterGroup] -> ShowS
CreateParameterGroup -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CreateParameterGroup] -> ShowS
$cshowList :: [CreateParameterGroup] -> ShowS
show :: CreateParameterGroup -> String
$cshow :: CreateParameterGroup -> String
showsPrec :: Int -> CreateParameterGroup -> ShowS
$cshowsPrec :: Int -> CreateParameterGroup -> ShowS
Prelude.Show, forall x. Rep CreateParameterGroup x -> CreateParameterGroup
forall x. CreateParameterGroup -> Rep CreateParameterGroup x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep CreateParameterGroup x -> CreateParameterGroup
$cfrom :: forall x. CreateParameterGroup -> Rep CreateParameterGroup x
Prelude.Generic)

-- |
-- Create a value of 'CreateParameterGroup' 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', 'createParameterGroup_description' - An optional description of the parameter group.
--
-- 'tags', 'createParameterGroup_tags' - A list of tags to be added to this resource. A tag is a key-value pair.
-- A tag key must be accompanied by a tag value, although null is accepted.
--
-- 'parameterGroupName', 'createParameterGroup_parameterGroupName' - The name of the parameter group.
--
-- 'family', 'createParameterGroup_family' - The name of the parameter group family that the parameter group can be
-- used with.
newCreateParameterGroup ::
  -- | 'parameterGroupName'
  Prelude.Text ->
  -- | 'family'
  Prelude.Text ->
  CreateParameterGroup
newCreateParameterGroup :: Text -> Text -> CreateParameterGroup
newCreateParameterGroup Text
pParameterGroupName_ Text
pFamily_ =
  CreateParameterGroup'
    { $sel:description:CreateParameterGroup' :: Maybe Text
description =
        forall a. Maybe a
Prelude.Nothing,
      $sel:tags:CreateParameterGroup' :: Maybe [Tag]
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:parameterGroupName:CreateParameterGroup' :: Text
parameterGroupName = Text
pParameterGroupName_,
      $sel:family:CreateParameterGroup' :: Text
family = Text
pFamily_
    }

-- | An optional description of the parameter group.
createParameterGroup_description :: Lens.Lens' CreateParameterGroup (Prelude.Maybe Prelude.Text)
createParameterGroup_description :: Lens' CreateParameterGroup (Maybe Text)
createParameterGroup_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateParameterGroup' {Maybe Text
description :: Maybe Text
$sel:description:CreateParameterGroup' :: CreateParameterGroup -> Maybe Text
description} -> Maybe Text
description) (\s :: CreateParameterGroup
s@CreateParameterGroup' {} Maybe Text
a -> CreateParameterGroup
s {$sel:description:CreateParameterGroup' :: Maybe Text
description = Maybe Text
a} :: CreateParameterGroup)

-- | A list of tags to be added to this resource. A tag is a key-value pair.
-- A tag key must be accompanied by a tag value, although null is accepted.
createParameterGroup_tags :: Lens.Lens' CreateParameterGroup (Prelude.Maybe [Tag])
createParameterGroup_tags :: Lens' CreateParameterGroup (Maybe [Tag])
createParameterGroup_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateParameterGroup' {Maybe [Tag]
tags :: Maybe [Tag]
$sel:tags:CreateParameterGroup' :: CreateParameterGroup -> Maybe [Tag]
tags} -> Maybe [Tag]
tags) (\s :: CreateParameterGroup
s@CreateParameterGroup' {} Maybe [Tag]
a -> CreateParameterGroup
s {$sel:tags:CreateParameterGroup' :: Maybe [Tag]
tags = Maybe [Tag]
a} :: CreateParameterGroup) 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 name of the parameter group.
createParameterGroup_parameterGroupName :: Lens.Lens' CreateParameterGroup Prelude.Text
createParameterGroup_parameterGroupName :: Lens' CreateParameterGroup Text
createParameterGroup_parameterGroupName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateParameterGroup' {Text
parameterGroupName :: Text
$sel:parameterGroupName:CreateParameterGroup' :: CreateParameterGroup -> Text
parameterGroupName} -> Text
parameterGroupName) (\s :: CreateParameterGroup
s@CreateParameterGroup' {} Text
a -> CreateParameterGroup
s {$sel:parameterGroupName:CreateParameterGroup' :: Text
parameterGroupName = Text
a} :: CreateParameterGroup)

-- | The name of the parameter group family that the parameter group can be
-- used with.
createParameterGroup_family :: Lens.Lens' CreateParameterGroup Prelude.Text
createParameterGroup_family :: Lens' CreateParameterGroup Text
createParameterGroup_family = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateParameterGroup' {Text
family :: Text
$sel:family:CreateParameterGroup' :: CreateParameterGroup -> Text
family} -> Text
family) (\s :: CreateParameterGroup
s@CreateParameterGroup' {} Text
a -> CreateParameterGroup
s {$sel:family:CreateParameterGroup' :: Text
family = Text
a} :: CreateParameterGroup)

instance Core.AWSRequest CreateParameterGroup where
  type
    AWSResponse CreateParameterGroup =
      CreateParameterGroupResponse
  request :: (Service -> Service)
-> CreateParameterGroup -> Request CreateParameterGroup
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 CreateParameterGroup
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse CreateParameterGroup)))
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 ParameterGroup -> Int -> CreateParameterGroupResponse
CreateParameterGroupResponse'
            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
"ParameterGroup")
            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 CreateParameterGroup where
  hashWithSalt :: Int -> CreateParameterGroup -> Int
hashWithSalt Int
_salt CreateParameterGroup' {Maybe [Tag]
Maybe Text
Text
family :: Text
parameterGroupName :: Text
tags :: Maybe [Tag]
description :: Maybe Text
$sel:family:CreateParameterGroup' :: CreateParameterGroup -> Text
$sel:parameterGroupName:CreateParameterGroup' :: CreateParameterGroup -> Text
$sel:tags:CreateParameterGroup' :: CreateParameterGroup -> Maybe [Tag]
$sel:description:CreateParameterGroup' :: CreateParameterGroup -> 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 [Tag]
tags
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
parameterGroupName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
family

instance Prelude.NFData CreateParameterGroup where
  rnf :: CreateParameterGroup -> ()
rnf CreateParameterGroup' {Maybe [Tag]
Maybe Text
Text
family :: Text
parameterGroupName :: Text
tags :: Maybe [Tag]
description :: Maybe Text
$sel:family:CreateParameterGroup' :: CreateParameterGroup -> Text
$sel:parameterGroupName:CreateParameterGroup' :: CreateParameterGroup -> Text
$sel:tags:CreateParameterGroup' :: CreateParameterGroup -> Maybe [Tag]
$sel:description:CreateParameterGroup' :: CreateParameterGroup -> 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 [Tag]
tags
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
parameterGroupName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
family

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

instance Data.ToJSON CreateParameterGroup where
  toJSON :: CreateParameterGroup -> Value
toJSON CreateParameterGroup' {Maybe [Tag]
Maybe Text
Text
family :: Text
parameterGroupName :: Text
tags :: Maybe [Tag]
description :: Maybe Text
$sel:family:CreateParameterGroup' :: CreateParameterGroup -> Text
$sel:parameterGroupName:CreateParameterGroup' :: CreateParameterGroup -> Text
$sel:tags:CreateParameterGroup' :: CreateParameterGroup -> Maybe [Tag]
$sel:description:CreateParameterGroup' :: CreateParameterGroup -> 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
"Tags" 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 [Tag]
tags,
            forall a. a -> Maybe a
Prelude.Just
              (Key
"ParameterGroupName" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
parameterGroupName),
            forall a. a -> Maybe a
Prelude.Just (Key
"Family" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
family)
          ]
      )

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

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

-- | /See:/ 'newCreateParameterGroupResponse' smart constructor.
data CreateParameterGroupResponse = CreateParameterGroupResponse'
  { -- | The newly-created parameter group.
    CreateParameterGroupResponse -> Maybe ParameterGroup
parameterGroup :: Prelude.Maybe ParameterGroup,
    -- | The response's http status code.
    CreateParameterGroupResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (CreateParameterGroupResponse
-> CreateParameterGroupResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CreateParameterGroupResponse
-> CreateParameterGroupResponse -> Bool
$c/= :: CreateParameterGroupResponse
-> CreateParameterGroupResponse -> Bool
== :: CreateParameterGroupResponse
-> CreateParameterGroupResponse -> Bool
$c== :: CreateParameterGroupResponse
-> CreateParameterGroupResponse -> Bool
Prelude.Eq, ReadPrec [CreateParameterGroupResponse]
ReadPrec CreateParameterGroupResponse
Int -> ReadS CreateParameterGroupResponse
ReadS [CreateParameterGroupResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CreateParameterGroupResponse]
$creadListPrec :: ReadPrec [CreateParameterGroupResponse]
readPrec :: ReadPrec CreateParameterGroupResponse
$creadPrec :: ReadPrec CreateParameterGroupResponse
readList :: ReadS [CreateParameterGroupResponse]
$creadList :: ReadS [CreateParameterGroupResponse]
readsPrec :: Int -> ReadS CreateParameterGroupResponse
$creadsPrec :: Int -> ReadS CreateParameterGroupResponse
Prelude.Read, Int -> CreateParameterGroupResponse -> ShowS
[CreateParameterGroupResponse] -> ShowS
CreateParameterGroupResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CreateParameterGroupResponse] -> ShowS
$cshowList :: [CreateParameterGroupResponse] -> ShowS
show :: CreateParameterGroupResponse -> String
$cshow :: CreateParameterGroupResponse -> String
showsPrec :: Int -> CreateParameterGroupResponse -> ShowS
$cshowsPrec :: Int -> CreateParameterGroupResponse -> ShowS
Prelude.Show, forall x.
Rep CreateParameterGroupResponse x -> CreateParameterGroupResponse
forall x.
CreateParameterGroupResponse -> Rep CreateParameterGroupResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep CreateParameterGroupResponse x -> CreateParameterGroupResponse
$cfrom :: forall x.
CreateParameterGroupResponse -> Rep CreateParameterGroupResponse x
Prelude.Generic)

-- |
-- Create a value of 'CreateParameterGroupResponse' 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:
--
-- 'parameterGroup', 'createParameterGroupResponse_parameterGroup' - The newly-created parameter group.
--
-- 'httpStatus', 'createParameterGroupResponse_httpStatus' - The response's http status code.
newCreateParameterGroupResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  CreateParameterGroupResponse
newCreateParameterGroupResponse :: Int -> CreateParameterGroupResponse
newCreateParameterGroupResponse Int
pHttpStatus_ =
  CreateParameterGroupResponse'
    { $sel:parameterGroup:CreateParameterGroupResponse' :: Maybe ParameterGroup
parameterGroup =
        forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:CreateParameterGroupResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The newly-created parameter group.
createParameterGroupResponse_parameterGroup :: Lens.Lens' CreateParameterGroupResponse (Prelude.Maybe ParameterGroup)
createParameterGroupResponse_parameterGroup :: Lens' CreateParameterGroupResponse (Maybe ParameterGroup)
createParameterGroupResponse_parameterGroup = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateParameterGroupResponse' {Maybe ParameterGroup
parameterGroup :: Maybe ParameterGroup
$sel:parameterGroup:CreateParameterGroupResponse' :: CreateParameterGroupResponse -> Maybe ParameterGroup
parameterGroup} -> Maybe ParameterGroup
parameterGroup) (\s :: CreateParameterGroupResponse
s@CreateParameterGroupResponse' {} Maybe ParameterGroup
a -> CreateParameterGroupResponse
s {$sel:parameterGroup:CreateParameterGroupResponse' :: Maybe ParameterGroup
parameterGroup = Maybe ParameterGroup
a} :: CreateParameterGroupResponse)

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

instance Prelude.NFData CreateParameterGroupResponse where
  rnf :: CreateParameterGroupResponse -> ()
rnf CreateParameterGroupResponse' {Int
Maybe ParameterGroup
httpStatus :: Int
parameterGroup :: Maybe ParameterGroup
$sel:httpStatus:CreateParameterGroupResponse' :: CreateParameterGroupResponse -> Int
$sel:parameterGroup:CreateParameterGroupResponse' :: CreateParameterGroupResponse -> Maybe ParameterGroup
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe ParameterGroup
parameterGroup
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus