module Stratosphere.PCAConnectorSCEP.Connector.IntuneConfigurationProperty (
        IntuneConfigurationProperty(..), mkIntuneConfigurationProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data IntuneConfigurationProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-pcaconnectorscep-connector-intuneconfiguration.html>
    IntuneConfigurationProperty {IntuneConfigurationProperty -> ()
haddock_workaround_ :: (),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-pcaconnectorscep-connector-intuneconfiguration.html#cfn-pcaconnectorscep-connector-intuneconfiguration-azureapplicationid>
                                 IntuneConfigurationProperty -> Value Text
azureApplicationId :: (Value Prelude.Text),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-pcaconnectorscep-connector-intuneconfiguration.html#cfn-pcaconnectorscep-connector-intuneconfiguration-domain>
                                 IntuneConfigurationProperty -> Value Text
domain :: (Value Prelude.Text)}
  deriving stock (IntuneConfigurationProperty -> IntuneConfigurationProperty -> Bool
(IntuneConfigurationProperty
 -> IntuneConfigurationProperty -> Bool)
-> (IntuneConfigurationProperty
    -> IntuneConfigurationProperty -> Bool)
-> Eq IntuneConfigurationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: IntuneConfigurationProperty -> IntuneConfigurationProperty -> Bool
== :: IntuneConfigurationProperty -> IntuneConfigurationProperty -> Bool
$c/= :: IntuneConfigurationProperty -> IntuneConfigurationProperty -> Bool
/= :: IntuneConfigurationProperty -> IntuneConfigurationProperty -> Bool
Prelude.Eq, Int -> IntuneConfigurationProperty -> ShowS
[IntuneConfigurationProperty] -> ShowS
IntuneConfigurationProperty -> String
(Int -> IntuneConfigurationProperty -> ShowS)
-> (IntuneConfigurationProperty -> String)
-> ([IntuneConfigurationProperty] -> ShowS)
-> Show IntuneConfigurationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> IntuneConfigurationProperty -> ShowS
showsPrec :: Int -> IntuneConfigurationProperty -> ShowS
$cshow :: IntuneConfigurationProperty -> String
show :: IntuneConfigurationProperty -> String
$cshowList :: [IntuneConfigurationProperty] -> ShowS
showList :: [IntuneConfigurationProperty] -> ShowS
Prelude.Show)
mkIntuneConfigurationProperty ::
  Value Prelude.Text
  -> Value Prelude.Text -> IntuneConfigurationProperty
mkIntuneConfigurationProperty :: Value Text -> Value Text -> IntuneConfigurationProperty
mkIntuneConfigurationProperty Value Text
azureApplicationId Value Text
domain
  = IntuneConfigurationProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), azureApplicationId :: Value Text
azureApplicationId = Value Text
azureApplicationId,
       domain :: Value Text
domain = Value Text
domain}
instance ToResourceProperties IntuneConfigurationProperty where
  toResourceProperties :: IntuneConfigurationProperty -> ResourceProperties
toResourceProperties IntuneConfigurationProperty {()
Value Text
haddock_workaround_ :: IntuneConfigurationProperty -> ()
azureApplicationId :: IntuneConfigurationProperty -> Value Text
domain :: IntuneConfigurationProperty -> Value Text
haddock_workaround_ :: ()
azureApplicationId :: Value Text
domain :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::PCAConnectorSCEP::Connector.IntuneConfiguration",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"AzureApplicationId" 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
azureApplicationId,
                       Key
"Domain" 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
domain]}
instance JSON.ToJSON IntuneConfigurationProperty where
  toJSON :: IntuneConfigurationProperty -> Value
toJSON IntuneConfigurationProperty {()
Value Text
haddock_workaround_ :: IntuneConfigurationProperty -> ()
azureApplicationId :: IntuneConfigurationProperty -> Value Text
domain :: IntuneConfigurationProperty -> Value Text
haddock_workaround_ :: ()
azureApplicationId :: Value Text
domain :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"AzureApplicationId" 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
azureApplicationId,
         Key
"Domain" 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
domain]
instance Property "AzureApplicationId" IntuneConfigurationProperty where
  type PropertyType "AzureApplicationId" IntuneConfigurationProperty = Value Prelude.Text
  set :: PropertyType "AzureApplicationId" IntuneConfigurationProperty
-> IntuneConfigurationProperty -> IntuneConfigurationProperty
set PropertyType "AzureApplicationId" IntuneConfigurationProperty
newValue IntuneConfigurationProperty {()
Value Text
haddock_workaround_ :: IntuneConfigurationProperty -> ()
azureApplicationId :: IntuneConfigurationProperty -> Value Text
domain :: IntuneConfigurationProperty -> Value Text
haddock_workaround_ :: ()
azureApplicationId :: Value Text
domain :: Value Text
..}
    = IntuneConfigurationProperty {azureApplicationId :: Value Text
azureApplicationId = PropertyType "AzureApplicationId" IntuneConfigurationProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
domain :: Value Text
haddock_workaround_ :: ()
domain :: Value Text
..}
instance Property "Domain" IntuneConfigurationProperty where
  type PropertyType "Domain" IntuneConfigurationProperty = Value Prelude.Text
  set :: PropertyType "Domain" IntuneConfigurationProperty
-> IntuneConfigurationProperty -> IntuneConfigurationProperty
set PropertyType "Domain" IntuneConfigurationProperty
newValue IntuneConfigurationProperty {()
Value Text
haddock_workaround_ :: IntuneConfigurationProperty -> ()
azureApplicationId :: IntuneConfigurationProperty -> Value Text
domain :: IntuneConfigurationProperty -> Value Text
haddock_workaround_ :: ()
azureApplicationId :: Value Text
domain :: Value Text
..}
    = IntuneConfigurationProperty {domain :: Value Text
domain = PropertyType "Domain" IntuneConfigurationProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
azureApplicationId :: Value Text
haddock_workaround_ :: ()
azureApplicationId :: Value Text
..}