module Stratosphere.AmazonMQ.Broker.MaintenanceWindowProperty (
MaintenanceWindowProperty(..), mkMaintenanceWindowProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data MaintenanceWindowProperty
=
MaintenanceWindowProperty {MaintenanceWindowProperty -> ()
haddock_workaround_ :: (),
MaintenanceWindowProperty -> Value Text
dayOfWeek :: (Value Prelude.Text),
MaintenanceWindowProperty -> Value Text
timeOfDay :: (Value Prelude.Text),
MaintenanceWindowProperty -> Value Text
timeZone :: (Value Prelude.Text)}
deriving stock (MaintenanceWindowProperty -> MaintenanceWindowProperty -> Bool
(MaintenanceWindowProperty -> MaintenanceWindowProperty -> Bool)
-> (MaintenanceWindowProperty -> MaintenanceWindowProperty -> Bool)
-> Eq MaintenanceWindowProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MaintenanceWindowProperty -> MaintenanceWindowProperty -> Bool
== :: MaintenanceWindowProperty -> MaintenanceWindowProperty -> Bool
$c/= :: MaintenanceWindowProperty -> MaintenanceWindowProperty -> Bool
/= :: MaintenanceWindowProperty -> MaintenanceWindowProperty -> Bool
Prelude.Eq, Int -> MaintenanceWindowProperty -> ShowS
[MaintenanceWindowProperty] -> ShowS
MaintenanceWindowProperty -> String
(Int -> MaintenanceWindowProperty -> ShowS)
-> (MaintenanceWindowProperty -> String)
-> ([MaintenanceWindowProperty] -> ShowS)
-> Show MaintenanceWindowProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MaintenanceWindowProperty -> ShowS
showsPrec :: Int -> MaintenanceWindowProperty -> ShowS
$cshow :: MaintenanceWindowProperty -> String
show :: MaintenanceWindowProperty -> String
$cshowList :: [MaintenanceWindowProperty] -> ShowS
showList :: [MaintenanceWindowProperty] -> ShowS
Prelude.Show)
mkMaintenanceWindowProperty ::
Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text -> MaintenanceWindowProperty
mkMaintenanceWindowProperty :: Value Text -> Value Text -> Value Text -> MaintenanceWindowProperty
mkMaintenanceWindowProperty Value Text
dayOfWeek Value Text
timeOfDay Value Text
timeZone
= MaintenanceWindowProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), dayOfWeek :: Value Text
dayOfWeek = Value Text
dayOfWeek,
timeOfDay :: Value Text
timeOfDay = Value Text
timeOfDay, timeZone :: Value Text
timeZone = Value Text
timeZone}
instance ToResourceProperties MaintenanceWindowProperty where
toResourceProperties :: MaintenanceWindowProperty -> ResourceProperties
toResourceProperties MaintenanceWindowProperty {()
Value Text
haddock_workaround_ :: MaintenanceWindowProperty -> ()
dayOfWeek :: MaintenanceWindowProperty -> Value Text
timeOfDay :: MaintenanceWindowProperty -> Value Text
timeZone :: MaintenanceWindowProperty -> Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeOfDay :: Value Text
timeZone :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::AmazonMQ::Broker.MaintenanceWindow",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"DayOfWeek" 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
dayOfWeek,
Key
"TimeOfDay" 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
timeOfDay, Key
"TimeZone" 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
timeZone]}
instance JSON.ToJSON MaintenanceWindowProperty where
toJSON :: MaintenanceWindowProperty -> Value
toJSON MaintenanceWindowProperty {()
Value Text
haddock_workaround_ :: MaintenanceWindowProperty -> ()
dayOfWeek :: MaintenanceWindowProperty -> Value Text
timeOfDay :: MaintenanceWindowProperty -> Value Text
timeZone :: MaintenanceWindowProperty -> Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeOfDay :: Value Text
timeZone :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"DayOfWeek" 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
dayOfWeek, Key
"TimeOfDay" 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
timeOfDay,
Key
"TimeZone" 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
timeZone]
instance Property "DayOfWeek" MaintenanceWindowProperty where
type PropertyType "DayOfWeek" MaintenanceWindowProperty = Value Prelude.Text
set :: PropertyType "DayOfWeek" MaintenanceWindowProperty
-> MaintenanceWindowProperty -> MaintenanceWindowProperty
set PropertyType "DayOfWeek" MaintenanceWindowProperty
newValue MaintenanceWindowProperty {()
Value Text
haddock_workaround_ :: MaintenanceWindowProperty -> ()
dayOfWeek :: MaintenanceWindowProperty -> Value Text
timeOfDay :: MaintenanceWindowProperty -> Value Text
timeZone :: MaintenanceWindowProperty -> Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeOfDay :: Value Text
timeZone :: Value Text
..}
= MaintenanceWindowProperty {dayOfWeek :: Value Text
dayOfWeek = PropertyType "DayOfWeek" MaintenanceWindowProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
timeOfDay :: Value Text
timeZone :: Value Text
haddock_workaround_ :: ()
timeOfDay :: Value Text
timeZone :: Value Text
..}
instance Property "TimeOfDay" MaintenanceWindowProperty where
type PropertyType "TimeOfDay" MaintenanceWindowProperty = Value Prelude.Text
set :: PropertyType "TimeOfDay" MaintenanceWindowProperty
-> MaintenanceWindowProperty -> MaintenanceWindowProperty
set PropertyType "TimeOfDay" MaintenanceWindowProperty
newValue MaintenanceWindowProperty {()
Value Text
haddock_workaround_ :: MaintenanceWindowProperty -> ()
dayOfWeek :: MaintenanceWindowProperty -> Value Text
timeOfDay :: MaintenanceWindowProperty -> Value Text
timeZone :: MaintenanceWindowProperty -> Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeOfDay :: Value Text
timeZone :: Value Text
..}
= MaintenanceWindowProperty {timeOfDay :: Value Text
timeOfDay = PropertyType "TimeOfDay" MaintenanceWindowProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeZone :: Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeZone :: Value Text
..}
instance Property "TimeZone" MaintenanceWindowProperty where
type PropertyType "TimeZone" MaintenanceWindowProperty = Value Prelude.Text
set :: PropertyType "TimeZone" MaintenanceWindowProperty
-> MaintenanceWindowProperty -> MaintenanceWindowProperty
set PropertyType "TimeZone" MaintenanceWindowProperty
newValue MaintenanceWindowProperty {()
Value Text
haddock_workaround_ :: MaintenanceWindowProperty -> ()
dayOfWeek :: MaintenanceWindowProperty -> Value Text
timeOfDay :: MaintenanceWindowProperty -> Value Text
timeZone :: MaintenanceWindowProperty -> Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeOfDay :: Value Text
timeZone :: Value Text
..}
= MaintenanceWindowProperty {timeZone :: Value Text
timeZone = PropertyType "TimeZone" MaintenanceWindowProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeOfDay :: Value Text
haddock_workaround_ :: ()
dayOfWeek :: Value Text
timeOfDay :: Value Text
..}