module Stratosphere.SageMaker.MonitoringSchedule (
        module Exports, MonitoringSchedule(..), mkMonitoringSchedule
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.SageMaker.MonitoringSchedule.MonitoringExecutionSummaryProperty as Exports
import {-# SOURCE #-} Stratosphere.SageMaker.MonitoringSchedule.MonitoringScheduleConfigProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data MonitoringSchedule
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-sagemaker-monitoringschedule.html>
    MonitoringSchedule {MonitoringSchedule -> ()
haddock_workaround_ :: (),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-sagemaker-monitoringschedule.html#cfn-sagemaker-monitoringschedule-endpointname>
                        MonitoringSchedule -> Maybe (Value Text)
endpointName :: (Prelude.Maybe (Value Prelude.Text)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-sagemaker-monitoringschedule.html#cfn-sagemaker-monitoringschedule-failurereason>
                        MonitoringSchedule -> Maybe (Value Text)
failureReason :: (Prelude.Maybe (Value Prelude.Text)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-sagemaker-monitoringschedule.html#cfn-sagemaker-monitoringschedule-lastmonitoringexecutionsummary>
                        MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
lastMonitoringExecutionSummary :: (Prelude.Maybe MonitoringExecutionSummaryProperty),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-sagemaker-monitoringschedule.html#cfn-sagemaker-monitoringschedule-monitoringscheduleconfig>
                        MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty,
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-sagemaker-monitoringschedule.html#cfn-sagemaker-monitoringschedule-monitoringschedulename>
                        MonitoringSchedule -> Value Text
monitoringScheduleName :: (Value Prelude.Text),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-sagemaker-monitoringschedule.html#cfn-sagemaker-monitoringschedule-monitoringschedulestatus>
                        MonitoringSchedule -> Maybe (Value Text)
monitoringScheduleStatus :: (Prelude.Maybe (Value Prelude.Text)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-sagemaker-monitoringschedule.html#cfn-sagemaker-monitoringschedule-tags>
                        MonitoringSchedule -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag])}
  deriving stock (MonitoringSchedule -> MonitoringSchedule -> Bool
(MonitoringSchedule -> MonitoringSchedule -> Bool)
-> (MonitoringSchedule -> MonitoringSchedule -> Bool)
-> Eq MonitoringSchedule
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MonitoringSchedule -> MonitoringSchedule -> Bool
== :: MonitoringSchedule -> MonitoringSchedule -> Bool
$c/= :: MonitoringSchedule -> MonitoringSchedule -> Bool
/= :: MonitoringSchedule -> MonitoringSchedule -> Bool
Prelude.Eq, Int -> MonitoringSchedule -> ShowS
[MonitoringSchedule] -> ShowS
MonitoringSchedule -> String
(Int -> MonitoringSchedule -> ShowS)
-> (MonitoringSchedule -> String)
-> ([MonitoringSchedule] -> ShowS)
-> Show MonitoringSchedule
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MonitoringSchedule -> ShowS
showsPrec :: Int -> MonitoringSchedule -> ShowS
$cshow :: MonitoringSchedule -> String
show :: MonitoringSchedule -> String
$cshowList :: [MonitoringSchedule] -> ShowS
showList :: [MonitoringSchedule] -> ShowS
Prelude.Show)
mkMonitoringSchedule ::
  MonitoringScheduleConfigProperty
  -> Value Prelude.Text -> MonitoringSchedule
mkMonitoringSchedule :: MonitoringScheduleConfigProperty
-> Value Text -> MonitoringSchedule
mkMonitoringSchedule
  MonitoringScheduleConfigProperty
monitoringScheduleConfig
  Value Text
monitoringScheduleName
  = MonitoringSchedule
      {haddock_workaround_ :: ()
haddock_workaround_ = (),
       monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleConfig = MonitoringScheduleConfigProperty
monitoringScheduleConfig,
       monitoringScheduleName :: Value Text
monitoringScheduleName = Value Text
monitoringScheduleName,
       endpointName :: Maybe (Value Text)
endpointName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, failureReason :: Maybe (Value Text)
failureReason = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
lastMonitoringExecutionSummary = Maybe MonitoringExecutionSummaryProperty
forall a. Maybe a
Prelude.Nothing,
       monitoringScheduleStatus :: Maybe (Value Text)
monitoringScheduleStatus = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties MonitoringSchedule where
  toResourceProperties :: MonitoringSchedule -> ResourceProperties
toResourceProperties MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::SageMaker::MonitoringSchedule",
         supportsTags :: Bool
supportsTags = Bool
Prelude.True,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
                           [Key
"MonitoringScheduleConfig" Key -> MonitoringScheduleConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= MonitoringScheduleConfigProperty
monitoringScheduleConfig,
                            Key
"MonitoringScheduleName" 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
monitoringScheduleName]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [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..=) Key
"EndpointName" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
endpointName,
                               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..=) Key
"FailureReason" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
failureReason,
                               Key -> MonitoringExecutionSummaryProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LastMonitoringExecutionSummary"
                                 (MonitoringExecutionSummaryProperty -> (Key, Value))
-> Maybe MonitoringExecutionSummaryProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MonitoringExecutionSummaryProperty
lastMonitoringExecutionSummary,
                               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..=) Key
"MonitoringScheduleStatus"
                                 (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
monitoringScheduleStatus,
                               Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags]))}
instance JSON.ToJSON MonitoringSchedule where
  toJSON :: MonitoringSchedule -> Value
toJSON MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
              [Key
"MonitoringScheduleConfig" Key -> MonitoringScheduleConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= MonitoringScheduleConfigProperty
monitoringScheduleConfig,
               Key
"MonitoringScheduleName" 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
monitoringScheduleName]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [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..=) Key
"EndpointName" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
endpointName,
                  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..=) Key
"FailureReason" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
failureReason,
                  Key -> MonitoringExecutionSummaryProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LastMonitoringExecutionSummary"
                    (MonitoringExecutionSummaryProperty -> (Key, Value))
-> Maybe MonitoringExecutionSummaryProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MonitoringExecutionSummaryProperty
lastMonitoringExecutionSummary,
                  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..=) Key
"MonitoringScheduleStatus"
                    (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
monitoringScheduleStatus,
                  Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags])))
instance Property "EndpointName" MonitoringSchedule where
  type PropertyType "EndpointName" MonitoringSchedule = Value Prelude.Text
  set :: PropertyType "EndpointName" MonitoringSchedule
-> MonitoringSchedule -> MonitoringSchedule
set PropertyType "EndpointName" MonitoringSchedule
newValue MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = MonitoringSchedule {endpointName :: Maybe (Value Text)
endpointName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EndpointName" MonitoringSchedule
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: ()
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "FailureReason" MonitoringSchedule where
  type PropertyType "FailureReason" MonitoringSchedule = Value Prelude.Text
  set :: PropertyType "FailureReason" MonitoringSchedule
-> MonitoringSchedule -> MonitoringSchedule
set PropertyType "FailureReason" MonitoringSchedule
newValue MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = MonitoringSchedule {failureReason :: Maybe (Value Text)
failureReason = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "FailureReason" MonitoringSchedule
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "LastMonitoringExecutionSummary" MonitoringSchedule where
  type PropertyType "LastMonitoringExecutionSummary" MonitoringSchedule = MonitoringExecutionSummaryProperty
  set :: PropertyType "LastMonitoringExecutionSummary" MonitoringSchedule
-> MonitoringSchedule -> MonitoringSchedule
set PropertyType "LastMonitoringExecutionSummary" MonitoringSchedule
newValue MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = MonitoringSchedule
        {lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
lastMonitoringExecutionSummary = MonitoringExecutionSummaryProperty
-> Maybe MonitoringExecutionSummaryProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LastMonitoringExecutionSummary" MonitoringSchedule
MonitoringExecutionSummaryProperty
newValue, Maybe [Tag]
Maybe (Value Text)
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "MonitoringScheduleConfig" MonitoringSchedule where
  type PropertyType "MonitoringScheduleConfig" MonitoringSchedule = MonitoringScheduleConfigProperty
  set :: PropertyType "MonitoringScheduleConfig" MonitoringSchedule
-> MonitoringSchedule -> MonitoringSchedule
set PropertyType "MonitoringScheduleConfig" MonitoringSchedule
newValue MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = MonitoringSchedule {monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleConfig = PropertyType "MonitoringScheduleConfig" MonitoringSchedule
MonitoringScheduleConfigProperty
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "MonitoringScheduleName" MonitoringSchedule where
  type PropertyType "MonitoringScheduleName" MonitoringSchedule = Value Prelude.Text
  set :: PropertyType "MonitoringScheduleName" MonitoringSchedule
-> MonitoringSchedule -> MonitoringSchedule
set PropertyType "MonitoringScheduleName" MonitoringSchedule
newValue MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = MonitoringSchedule {monitoringScheduleName :: Value Text
monitoringScheduleName = PropertyType "MonitoringScheduleName" MonitoringSchedule
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
MonitoringScheduleConfigProperty
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "MonitoringScheduleStatus" MonitoringSchedule where
  type PropertyType "MonitoringScheduleStatus" MonitoringSchedule = Value Prelude.Text
  set :: PropertyType "MonitoringScheduleStatus" MonitoringSchedule
-> MonitoringSchedule -> MonitoringSchedule
set PropertyType "MonitoringScheduleStatus" MonitoringSchedule
newValue MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = MonitoringSchedule
        {monitoringScheduleStatus :: Maybe (Value Text)
monitoringScheduleStatus = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MonitoringScheduleStatus" MonitoringSchedule
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
tags :: Maybe [Tag]
..}
instance Property "Tags" MonitoringSchedule where
  type PropertyType "Tags" MonitoringSchedule = [Tag]
  set :: PropertyType "Tags" MonitoringSchedule
-> MonitoringSchedule -> MonitoringSchedule
set PropertyType "Tags" MonitoringSchedule
newValue MonitoringSchedule {Maybe [Tag]
Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: MonitoringSchedule -> ()
endpointName :: MonitoringSchedule -> Maybe (Value Text)
failureReason :: MonitoringSchedule -> Maybe (Value Text)
lastMonitoringExecutionSummary :: MonitoringSchedule -> Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringSchedule -> MonitoringScheduleConfigProperty
monitoringScheduleName :: MonitoringSchedule -> Value Text
monitoringScheduleStatus :: MonitoringSchedule -> Maybe (Value Text)
tags :: MonitoringSchedule -> Maybe [Tag]
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = MonitoringSchedule {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" MonitoringSchedule
newValue, Maybe (Value Text)
Maybe MonitoringExecutionSummaryProperty
()
Value Text
MonitoringScheduleConfigProperty
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
haddock_workaround_ :: ()
endpointName :: Maybe (Value Text)
failureReason :: Maybe (Value Text)
lastMonitoringExecutionSummary :: Maybe MonitoringExecutionSummaryProperty
monitoringScheduleConfig :: MonitoringScheduleConfigProperty
monitoringScheduleName :: Value Text
monitoringScheduleStatus :: Maybe (Value Text)
..}