module Stratosphere.Logs.SubscriptionFilter (
        SubscriptionFilter(..), mkSubscriptionFilter
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data SubscriptionFilter
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html>
    SubscriptionFilter {SubscriptionFilter -> ()
haddock_workaround_ :: (),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-applyontransformedlogs>
                        SubscriptionFilter -> Maybe (Value Bool)
applyOnTransformedLogs :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-destinationarn>
                        SubscriptionFilter -> Value Text
destinationArn :: (Value Prelude.Text),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-distribution>
                        SubscriptionFilter -> Maybe (Value Text)
distribution :: (Prelude.Maybe (Value Prelude.Text)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-emitsystemfields>
                        SubscriptionFilter -> Maybe (ValueList Text)
emitSystemFields :: (Prelude.Maybe (ValueList Prelude.Text)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-fieldselectioncriteria>
                        SubscriptionFilter -> Maybe (Value Text)
fieldSelectionCriteria :: (Prelude.Maybe (Value Prelude.Text)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-filtername>
                        SubscriptionFilter -> Maybe (Value Text)
filterName :: (Prelude.Maybe (Value Prelude.Text)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-filterpattern>
                        SubscriptionFilter -> Value Text
filterPattern :: (Value Prelude.Text),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-loggroupname>
                        SubscriptionFilter -> Value Text
logGroupName :: (Value Prelude.Text),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-logs-subscriptionfilter.html#cfn-logs-subscriptionfilter-rolearn>
                        SubscriptionFilter -> Maybe (Value Text)
roleArn :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (SubscriptionFilter -> SubscriptionFilter -> Bool
(SubscriptionFilter -> SubscriptionFilter -> Bool)
-> (SubscriptionFilter -> SubscriptionFilter -> Bool)
-> Eq SubscriptionFilter
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SubscriptionFilter -> SubscriptionFilter -> Bool
== :: SubscriptionFilter -> SubscriptionFilter -> Bool
$c/= :: SubscriptionFilter -> SubscriptionFilter -> Bool
/= :: SubscriptionFilter -> SubscriptionFilter -> Bool
Prelude.Eq, Int -> SubscriptionFilter -> ShowS
[SubscriptionFilter] -> ShowS
SubscriptionFilter -> String
(Int -> SubscriptionFilter -> ShowS)
-> (SubscriptionFilter -> String)
-> ([SubscriptionFilter] -> ShowS)
-> Show SubscriptionFilter
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SubscriptionFilter -> ShowS
showsPrec :: Int -> SubscriptionFilter -> ShowS
$cshow :: SubscriptionFilter -> String
show :: SubscriptionFilter -> String
$cshowList :: [SubscriptionFilter] -> ShowS
showList :: [SubscriptionFilter] -> ShowS
Prelude.Show)
mkSubscriptionFilter ::
  Value Prelude.Text
  -> Value Prelude.Text -> Value Prelude.Text -> SubscriptionFilter
mkSubscriptionFilter :: Value Text -> Value Text -> Value Text -> SubscriptionFilter
mkSubscriptionFilter Value Text
destinationArn Value Text
filterPattern Value Text
logGroupName
  = SubscriptionFilter
      {haddock_workaround_ :: ()
haddock_workaround_ = (), destinationArn :: Value Text
destinationArn = Value Text
destinationArn,
       filterPattern :: Value Text
filterPattern = Value Text
filterPattern, logGroupName :: Value Text
logGroupName = Value Text
logGroupName,
       applyOnTransformedLogs :: Maybe (Value Bool)
applyOnTransformedLogs = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       distribution :: Maybe (Value Text)
distribution = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, emitSystemFields :: Maybe (ValueList Text)
emitSystemFields = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
       fieldSelectionCriteria :: Maybe (Value Text)
fieldSelectionCriteria = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       filterName :: Maybe (Value Text)
filterName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, roleArn :: Maybe (Value Text)
roleArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties SubscriptionFilter where
  toResourceProperties :: SubscriptionFilter -> ResourceProperties
toResourceProperties SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Logs::SubscriptionFilter",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         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
"DestinationArn" 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
destinationArn,
                            Key
"FilterPattern" 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
filterPattern,
                            Key
"LogGroupName" 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
logGroupName]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ApplyOnTransformedLogs"
                                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
applyOnTransformedLogs,
                               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
"Distribution" (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)
distribution,
                               Key -> ValueList 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
"EmitSystemFields" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
emitSystemFields,
                               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
"FieldSelectionCriteria"
                                 (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)
fieldSelectionCriteria,
                               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
"FilterName" (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)
filterName,
                               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
"RoleArn" (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)
roleArn]))}
instance JSON.ToJSON SubscriptionFilter where
  toJSON :: SubscriptionFilter -> Value
toJSON SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = [(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
"DestinationArn" 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
destinationArn,
               Key
"FilterPattern" 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
filterPattern,
               Key
"LogGroupName" 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
logGroupName]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ApplyOnTransformedLogs"
                    (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
applyOnTransformedLogs,
                  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
"Distribution" (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)
distribution,
                  Key -> ValueList 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
"EmitSystemFields" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
emitSystemFields,
                  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
"FieldSelectionCriteria"
                    (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)
fieldSelectionCriteria,
                  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
"FilterName" (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)
filterName,
                  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
"RoleArn" (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)
roleArn])))
instance Property "ApplyOnTransformedLogs" SubscriptionFilter where
  type PropertyType "ApplyOnTransformedLogs" SubscriptionFilter = Value Prelude.Bool
  set :: PropertyType "ApplyOnTransformedLogs" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "ApplyOnTransformedLogs" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter
        {applyOnTransformedLogs :: Maybe (Value Bool)
applyOnTransformedLogs = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ApplyOnTransformedLogs" SubscriptionFilter
Value Bool
newValue, Maybe (ValueList Text)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
instance Property "DestinationArn" SubscriptionFilter where
  type PropertyType "DestinationArn" SubscriptionFilter = Value Prelude.Text
  set :: PropertyType "DestinationArn" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "DestinationArn" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter {destinationArn :: Value Text
destinationArn = PropertyType "DestinationArn" SubscriptionFilter
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
instance Property "Distribution" SubscriptionFilter where
  type PropertyType "Distribution" SubscriptionFilter = Value Prelude.Text
  set :: PropertyType "Distribution" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "Distribution" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter {distribution :: Maybe (Value Text)
distribution = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Distribution" SubscriptionFilter
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
instance Property "EmitSystemFields" SubscriptionFilter where
  type PropertyType "EmitSystemFields" SubscriptionFilter = ValueList Prelude.Text
  set :: PropertyType "EmitSystemFields" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "EmitSystemFields" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter {emitSystemFields :: Maybe (ValueList Text)
emitSystemFields = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EmitSystemFields" SubscriptionFilter
ValueList Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
instance Property "FieldSelectionCriteria" SubscriptionFilter where
  type PropertyType "FieldSelectionCriteria" SubscriptionFilter = Value Prelude.Text
  set :: PropertyType "FieldSelectionCriteria" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "FieldSelectionCriteria" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter
        {fieldSelectionCriteria :: Maybe (Value Text)
fieldSelectionCriteria = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "FieldSelectionCriteria" SubscriptionFilter
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
instance Property "FilterName" SubscriptionFilter where
  type PropertyType "FilterName" SubscriptionFilter = Value Prelude.Text
  set :: PropertyType "FilterName" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "FilterName" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter {filterName :: Maybe (Value Text)
filterName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "FilterName" SubscriptionFilter
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
instance Property "FilterPattern" SubscriptionFilter where
  type PropertyType "FilterPattern" SubscriptionFilter = Value Prelude.Text
  set :: PropertyType "FilterPattern" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "FilterPattern" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter {filterPattern :: Value Text
filterPattern = PropertyType "FilterPattern" SubscriptionFilter
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
instance Property "LogGroupName" SubscriptionFilter where
  type PropertyType "LogGroupName" SubscriptionFilter = Value Prelude.Text
  set :: PropertyType "LogGroupName" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "LogGroupName" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter {logGroupName :: Value Text
logGroupName = PropertyType "LogGroupName" SubscriptionFilter
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
roleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
roleArn :: Maybe (Value Text)
..}
instance Property "RoleArn" SubscriptionFilter where
  type PropertyType "RoleArn" SubscriptionFilter = Value Prelude.Text
  set :: PropertyType "RoleArn" SubscriptionFilter
-> SubscriptionFilter -> SubscriptionFilter
set PropertyType "RoleArn" SubscriptionFilter
newValue SubscriptionFilter {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SubscriptionFilter -> ()
applyOnTransformedLogs :: SubscriptionFilter -> Maybe (Value Bool)
destinationArn :: SubscriptionFilter -> Value Text
distribution :: SubscriptionFilter -> Maybe (Value Text)
emitSystemFields :: SubscriptionFilter -> Maybe (ValueList Text)
fieldSelectionCriteria :: SubscriptionFilter -> Maybe (Value Text)
filterName :: SubscriptionFilter -> Maybe (Value Text)
filterPattern :: SubscriptionFilter -> Value Text
logGroupName :: SubscriptionFilter -> Value Text
roleArn :: SubscriptionFilter -> Maybe (Value Text)
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
roleArn :: Maybe (Value Text)
..}
    = SubscriptionFilter {roleArn :: Maybe (Value Text)
roleArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RoleArn" SubscriptionFilter
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
haddock_workaround_ :: ()
applyOnTransformedLogs :: Maybe (Value Bool)
destinationArn :: Value Text
distribution :: Maybe (Value Text)
emitSystemFields :: Maybe (ValueList Text)
fieldSelectionCriteria :: Maybe (Value Text)
filterName :: Maybe (Value Text)
filterPattern :: Value Text
logGroupName :: Value Text
..}