module Stratosphere.RolesAnywhere.Profile.MappingRuleProperty (
MappingRuleProperty(..), mkMappingRuleProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data MappingRuleProperty
=
MappingRuleProperty {MappingRuleProperty -> ()
haddock_workaround_ :: (),
MappingRuleProperty -> Value Text
specifier :: (Value Prelude.Text)}
deriving stock (MappingRuleProperty -> MappingRuleProperty -> Bool
(MappingRuleProperty -> MappingRuleProperty -> Bool)
-> (MappingRuleProperty -> MappingRuleProperty -> Bool)
-> Eq MappingRuleProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MappingRuleProperty -> MappingRuleProperty -> Bool
== :: MappingRuleProperty -> MappingRuleProperty -> Bool
$c/= :: MappingRuleProperty -> MappingRuleProperty -> Bool
/= :: MappingRuleProperty -> MappingRuleProperty -> Bool
Prelude.Eq, Int -> MappingRuleProperty -> ShowS
[MappingRuleProperty] -> ShowS
MappingRuleProperty -> String
(Int -> MappingRuleProperty -> ShowS)
-> (MappingRuleProperty -> String)
-> ([MappingRuleProperty] -> ShowS)
-> Show MappingRuleProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MappingRuleProperty -> ShowS
showsPrec :: Int -> MappingRuleProperty -> ShowS
$cshow :: MappingRuleProperty -> String
show :: MappingRuleProperty -> String
$cshowList :: [MappingRuleProperty] -> ShowS
showList :: [MappingRuleProperty] -> ShowS
Prelude.Show)
mkMappingRuleProperty :: Value Prelude.Text -> MappingRuleProperty
mkMappingRuleProperty :: Value Text -> MappingRuleProperty
mkMappingRuleProperty Value Text
specifier
= MappingRuleProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), specifier :: Value Text
specifier = Value Text
specifier}
instance ToResourceProperties MappingRuleProperty where
toResourceProperties :: MappingRuleProperty -> ResourceProperties
toResourceProperties MappingRuleProperty {()
Value Text
haddock_workaround_ :: MappingRuleProperty -> ()
specifier :: MappingRuleProperty -> Value Text
haddock_workaround_ :: ()
specifier :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::RolesAnywhere::Profile.MappingRule",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"Specifier" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
specifier]}
instance JSON.ToJSON MappingRuleProperty where
toJSON :: MappingRuleProperty -> Value
toJSON MappingRuleProperty {()
Value Text
haddock_workaround_ :: MappingRuleProperty -> ()
specifier :: MappingRuleProperty -> Value Text
haddock_workaround_ :: ()
specifier :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object [Key
"Specifier" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
specifier]
instance Property "Specifier" MappingRuleProperty where
type PropertyType "Specifier" MappingRuleProperty = Value Prelude.Text
set :: PropertyType "Specifier" MappingRuleProperty
-> MappingRuleProperty -> MappingRuleProperty
set PropertyType "Specifier" MappingRuleProperty
newValue MappingRuleProperty {()
Value Text
haddock_workaround_ :: MappingRuleProperty -> ()
specifier :: MappingRuleProperty -> Value Text
haddock_workaround_ :: ()
specifier :: Value Text
..}
= MappingRuleProperty {specifier :: Value Text
specifier = PropertyType "Specifier" MappingRuleProperty
Value Text
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}