module Stratosphere.Route53.RecordSetGroup.GeoProximityLocationProperty (
        module Exports, GeoProximityLocationProperty(..),
        mkGeoProximityLocationProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Route53.RecordSetGroup.CoordinatesProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data GeoProximityLocationProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-route53-geoproximitylocation.html>
    GeoProximityLocationProperty {GeoProximityLocationProperty -> ()
haddock_workaround_ :: (),
                                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-route53-geoproximitylocation.html#cfn-route53-geoproximitylocation-awsregion>
                                  GeoProximityLocationProperty -> Maybe (Value Text)
aWSRegion :: (Prelude.Maybe (Value Prelude.Text)),
                                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-route53-geoproximitylocation.html#cfn-route53-geoproximitylocation-bias>
                                  GeoProximityLocationProperty -> Maybe (Value Integer)
bias :: (Prelude.Maybe (Value Prelude.Integer)),
                                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-route53-geoproximitylocation.html#cfn-route53-geoproximitylocation-coordinates>
                                  GeoProximityLocationProperty -> Maybe CoordinatesProperty
coordinates :: (Prelude.Maybe CoordinatesProperty),
                                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-route53-geoproximitylocation.html#cfn-route53-geoproximitylocation-LocalZoneGroup>
                                  GeoProximityLocationProperty -> Maybe (Value Text)
localZoneGroup :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (GeoProximityLocationProperty
-> GeoProximityLocationProperty -> Bool
(GeoProximityLocationProperty
 -> GeoProximityLocationProperty -> Bool)
-> (GeoProximityLocationProperty
    -> GeoProximityLocationProperty -> Bool)
-> Eq GeoProximityLocationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: GeoProximityLocationProperty
-> GeoProximityLocationProperty -> Bool
== :: GeoProximityLocationProperty
-> GeoProximityLocationProperty -> Bool
$c/= :: GeoProximityLocationProperty
-> GeoProximityLocationProperty -> Bool
/= :: GeoProximityLocationProperty
-> GeoProximityLocationProperty -> Bool
Prelude.Eq, Int -> GeoProximityLocationProperty -> ShowS
[GeoProximityLocationProperty] -> ShowS
GeoProximityLocationProperty -> String
(Int -> GeoProximityLocationProperty -> ShowS)
-> (GeoProximityLocationProperty -> String)
-> ([GeoProximityLocationProperty] -> ShowS)
-> Show GeoProximityLocationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> GeoProximityLocationProperty -> ShowS
showsPrec :: Int -> GeoProximityLocationProperty -> ShowS
$cshow :: GeoProximityLocationProperty -> String
show :: GeoProximityLocationProperty -> String
$cshowList :: [GeoProximityLocationProperty] -> ShowS
showList :: [GeoProximityLocationProperty] -> ShowS
Prelude.Show)
mkGeoProximityLocationProperty :: GeoProximityLocationProperty
mkGeoProximityLocationProperty :: GeoProximityLocationProperty
mkGeoProximityLocationProperty
  = GeoProximityLocationProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), aWSRegion :: Maybe (Value Text)
aWSRegion = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       bias :: Maybe (Value Integer)
bias = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, coordinates :: Maybe CoordinatesProperty
coordinates = Maybe CoordinatesProperty
forall a. Maybe a
Prelude.Nothing,
       localZoneGroup :: Maybe (Value Text)
localZoneGroup = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties GeoProximityLocationProperty where
  toResourceProperties :: GeoProximityLocationProperty -> ResourceProperties
toResourceProperties GeoProximityLocationProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: GeoProximityLocationProperty -> ()
aWSRegion :: GeoProximityLocationProperty -> Maybe (Value Text)
bias :: GeoProximityLocationProperty -> Maybe (Value Integer)
coordinates :: GeoProximityLocationProperty -> Maybe CoordinatesProperty
localZoneGroup :: GeoProximityLocationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Route53::RecordSetGroup.GeoProximityLocation",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([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
"AWSRegion" (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)
aWSRegion,
                            Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Bias" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
bias,
                            Key -> CoordinatesProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Coordinates" (CoordinatesProperty -> (Key, Value))
-> Maybe CoordinatesProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CoordinatesProperty
coordinates,
                            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
"LocalZoneGroup" (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)
localZoneGroup])}
instance JSON.ToJSON GeoProximityLocationProperty where
  toJSON :: GeoProximityLocationProperty -> Value
toJSON GeoProximityLocationProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: GeoProximityLocationProperty -> ()
aWSRegion :: GeoProximityLocationProperty -> Maybe (Value Text)
bias :: GeoProximityLocationProperty -> Maybe (Value Integer)
coordinates :: GeoProximityLocationProperty -> Maybe CoordinatesProperty
localZoneGroup :: GeoProximityLocationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([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
"AWSRegion" (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)
aWSRegion,
               Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Bias" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
bias,
               Key -> CoordinatesProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Coordinates" (CoordinatesProperty -> (Key, Value))
-> Maybe CoordinatesProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CoordinatesProperty
coordinates,
               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
"LocalZoneGroup" (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)
localZoneGroup]))
instance Property "AWSRegion" GeoProximityLocationProperty where
  type PropertyType "AWSRegion" GeoProximityLocationProperty = Value Prelude.Text
  set :: PropertyType "AWSRegion" GeoProximityLocationProperty
-> GeoProximityLocationProperty -> GeoProximityLocationProperty
set PropertyType "AWSRegion" GeoProximityLocationProperty
newValue GeoProximityLocationProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: GeoProximityLocationProperty -> ()
aWSRegion :: GeoProximityLocationProperty -> Maybe (Value Text)
bias :: GeoProximityLocationProperty -> Maybe (Value Integer)
coordinates :: GeoProximityLocationProperty -> Maybe CoordinatesProperty
localZoneGroup :: GeoProximityLocationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
..}
    = GeoProximityLocationProperty
        {aWSRegion :: Maybe (Value Text)
aWSRegion = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AWSRegion" GeoProximityLocationProperty
Value Text
newValue, Maybe (Value Integer)
Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: ()
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
haddock_workaround_ :: ()
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
..}
instance Property "Bias" GeoProximityLocationProperty where
  type PropertyType "Bias" GeoProximityLocationProperty = Value Prelude.Integer
  set :: PropertyType "Bias" GeoProximityLocationProperty
-> GeoProximityLocationProperty -> GeoProximityLocationProperty
set PropertyType "Bias" GeoProximityLocationProperty
newValue GeoProximityLocationProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: GeoProximityLocationProperty -> ()
aWSRegion :: GeoProximityLocationProperty -> Maybe (Value Text)
bias :: GeoProximityLocationProperty -> Maybe (Value Integer)
coordinates :: GeoProximityLocationProperty -> Maybe CoordinatesProperty
localZoneGroup :: GeoProximityLocationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
..}
    = GeoProximityLocationProperty {bias :: Maybe (Value Integer)
bias = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Bias" GeoProximityLocationProperty
Value Integer
newValue, Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
..}
instance Property "Coordinates" GeoProximityLocationProperty where
  type PropertyType "Coordinates" GeoProximityLocationProperty = CoordinatesProperty
  set :: PropertyType "Coordinates" GeoProximityLocationProperty
-> GeoProximityLocationProperty -> GeoProximityLocationProperty
set PropertyType "Coordinates" GeoProximityLocationProperty
newValue GeoProximityLocationProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: GeoProximityLocationProperty -> ()
aWSRegion :: GeoProximityLocationProperty -> Maybe (Value Text)
bias :: GeoProximityLocationProperty -> Maybe (Value Integer)
coordinates :: GeoProximityLocationProperty -> Maybe CoordinatesProperty
localZoneGroup :: GeoProximityLocationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
..}
    = GeoProximityLocationProperty
        {coordinates :: Maybe CoordinatesProperty
coordinates = CoordinatesProperty -> Maybe CoordinatesProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Coordinates" GeoProximityLocationProperty
CoordinatesProperty
newValue, Maybe (Value Integer)
Maybe (Value Text)
()
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
localZoneGroup :: Maybe (Value Text)
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
localZoneGroup :: Maybe (Value Text)
..}
instance Property "LocalZoneGroup" GeoProximityLocationProperty where
  type PropertyType "LocalZoneGroup" GeoProximityLocationProperty = Value Prelude.Text
  set :: PropertyType "LocalZoneGroup" GeoProximityLocationProperty
-> GeoProximityLocationProperty -> GeoProximityLocationProperty
set PropertyType "LocalZoneGroup" GeoProximityLocationProperty
newValue GeoProximityLocationProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: GeoProximityLocationProperty -> ()
aWSRegion :: GeoProximityLocationProperty -> Maybe (Value Text)
bias :: GeoProximityLocationProperty -> Maybe (Value Integer)
coordinates :: GeoProximityLocationProperty -> Maybe CoordinatesProperty
localZoneGroup :: GeoProximityLocationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
localZoneGroup :: Maybe (Value Text)
..}
    = GeoProximityLocationProperty
        {localZoneGroup :: Maybe (Value Text)
localZoneGroup = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LocalZoneGroup" GeoProximityLocationProperty
Value Text
newValue, Maybe (Value Integer)
Maybe (Value Text)
Maybe CoordinatesProperty
()
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
haddock_workaround_ :: ()
aWSRegion :: Maybe (Value Text)
bias :: Maybe (Value Integer)
coordinates :: Maybe CoordinatesProperty
..}