module Stratosphere.DataSync.LocationSMB (
        module Exports, LocationSMB(..), mkLocationSMB
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.DataSync.LocationSMB.CmkSecretConfigProperty as Exports
import {-# SOURCE #-} Stratosphere.DataSync.LocationSMB.CustomSecretConfigProperty as Exports
import {-# SOURCE #-} Stratosphere.DataSync.LocationSMB.MountOptionsProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data LocationSMB
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html>
    LocationSMB {LocationSMB -> ()
haddock_workaround_ :: (),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-agentarns>
                 LocationSMB -> ValueList Text
agentArns :: (ValueList Prelude.Text),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-authenticationtype>
                 LocationSMB -> Maybe (Value Text)
authenticationType :: (Prelude.Maybe (Value Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-cmksecretconfig>
                 LocationSMB -> Maybe CmkSecretConfigProperty
cmkSecretConfig :: (Prelude.Maybe CmkSecretConfigProperty),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-customsecretconfig>
                 LocationSMB -> Maybe CustomSecretConfigProperty
customSecretConfig :: (Prelude.Maybe CustomSecretConfigProperty),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-dnsipaddresses>
                 LocationSMB -> Maybe (ValueList Text)
dnsIpAddresses :: (Prelude.Maybe (ValueList Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-domain>
                 LocationSMB -> Maybe (Value Text)
domain :: (Prelude.Maybe (Value Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-kerberoskeytab>
                 LocationSMB -> Maybe (Value Text)
kerberosKeytab :: (Prelude.Maybe (Value Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-kerberoskrb5conf>
                 LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: (Prelude.Maybe (Value Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-kerberosprincipal>
                 LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: (Prelude.Maybe (Value Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-mountoptions>
                 LocationSMB -> Maybe MountOptionsProperty
mountOptions :: (Prelude.Maybe MountOptionsProperty),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-password>
                 LocationSMB -> Maybe (Value Text)
password :: (Prelude.Maybe (Value Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-serverhostname>
                 LocationSMB -> Maybe (Value Text)
serverHostname :: (Prelude.Maybe (Value Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-subdirectory>
                 LocationSMB -> Maybe (Value Text)
subdirectory :: (Prelude.Maybe (Value Prelude.Text)),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-tags>
                 LocationSMB -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag]),
                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-datasync-locationsmb.html#cfn-datasync-locationsmb-user>
                 LocationSMB -> Maybe (Value Text)
user :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (LocationSMB -> LocationSMB -> Bool
(LocationSMB -> LocationSMB -> Bool)
-> (LocationSMB -> LocationSMB -> Bool) -> Eq LocationSMB
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: LocationSMB -> LocationSMB -> Bool
== :: LocationSMB -> LocationSMB -> Bool
$c/= :: LocationSMB -> LocationSMB -> Bool
/= :: LocationSMB -> LocationSMB -> Bool
Prelude.Eq, Int -> LocationSMB -> ShowS
[LocationSMB] -> ShowS
LocationSMB -> String
(Int -> LocationSMB -> ShowS)
-> (LocationSMB -> String)
-> ([LocationSMB] -> ShowS)
-> Show LocationSMB
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> LocationSMB -> ShowS
showsPrec :: Int -> LocationSMB -> ShowS
$cshow :: LocationSMB -> String
show :: LocationSMB -> String
$cshowList :: [LocationSMB] -> ShowS
showList :: [LocationSMB] -> ShowS
Prelude.Show)
mkLocationSMB :: ValueList Prelude.Text -> LocationSMB
mkLocationSMB :: ValueList Text -> LocationSMB
mkLocationSMB ValueList Text
agentArns
  = LocationSMB
      {haddock_workaround_ :: ()
haddock_workaround_ = (), agentArns :: ValueList Text
agentArns = ValueList Text
agentArns,
       authenticationType :: Maybe (Value Text)
authenticationType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       cmkSecretConfig :: Maybe CmkSecretConfigProperty
cmkSecretConfig = Maybe CmkSecretConfigProperty
forall a. Maybe a
Prelude.Nothing,
       customSecretConfig :: Maybe CustomSecretConfigProperty
customSecretConfig = Maybe CustomSecretConfigProperty
forall a. Maybe a
Prelude.Nothing,
       dnsIpAddresses :: Maybe (ValueList Text)
dnsIpAddresses = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing, domain :: Maybe (Value Text)
domain = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       kerberosKeytab :: Maybe (Value Text)
kerberosKeytab = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       kerberosKrb5Conf :: Maybe (Value Text)
kerberosKrb5Conf = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       kerberosPrincipal :: Maybe (Value Text)
kerberosPrincipal = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       mountOptions :: Maybe MountOptionsProperty
mountOptions = Maybe MountOptionsProperty
forall a. Maybe a
Prelude.Nothing, password :: Maybe (Value Text)
password = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       serverHostname :: Maybe (Value Text)
serverHostname = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, subdirectory :: Maybe (Value Text)
subdirectory = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing, user :: Maybe (Value Text)
user = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties LocationSMB where
  toResourceProperties :: LocationSMB -> ResourceProperties
toResourceProperties LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::DataSync::LocationSMB",
         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
"AgentArns" 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..= ValueList Text
agentArns]
                           ([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
"AuthenticationType" (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)
authenticationType,
                               Key -> CmkSecretConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CmkSecretConfig" (CmkSecretConfigProperty -> (Key, Value))
-> Maybe CmkSecretConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CmkSecretConfigProperty
cmkSecretConfig,
                               Key -> CustomSecretConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CustomSecretConfig" (CustomSecretConfigProperty -> (Key, Value))
-> Maybe CustomSecretConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CustomSecretConfigProperty
customSecretConfig,
                               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
"DnsIpAddresses" (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)
dnsIpAddresses,
                               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
"Domain" (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)
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..=) Key
"KerberosKeytab" (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)
kerberosKeytab,
                               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
"KerberosKrb5Conf" (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)
kerberosKrb5Conf,
                               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
"KerberosPrincipal" (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)
kerberosPrincipal,
                               Key -> MountOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MountOptions" (MountOptionsProperty -> (Key, Value))
-> Maybe MountOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MountOptionsProperty
mountOptions,
                               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
"Password" (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)
password,
                               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
"ServerHostname" (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)
serverHostname,
                               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
"Subdirectory" (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)
subdirectory,
                               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,
                               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
"User" (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)
user]))}
instance JSON.ToJSON LocationSMB where
  toJSON :: LocationSMB -> Value
toJSON LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: 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
"AgentArns" 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..= ValueList Text
agentArns]
              ([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
"AuthenticationType" (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)
authenticationType,
                  Key -> CmkSecretConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CmkSecretConfig" (CmkSecretConfigProperty -> (Key, Value))
-> Maybe CmkSecretConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CmkSecretConfigProperty
cmkSecretConfig,
                  Key -> CustomSecretConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CustomSecretConfig" (CustomSecretConfigProperty -> (Key, Value))
-> Maybe CustomSecretConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CustomSecretConfigProperty
customSecretConfig,
                  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
"DnsIpAddresses" (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)
dnsIpAddresses,
                  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
"Domain" (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)
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..=) Key
"KerberosKeytab" (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)
kerberosKeytab,
                  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
"KerberosKrb5Conf" (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)
kerberosKrb5Conf,
                  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
"KerberosPrincipal" (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)
kerberosPrincipal,
                  Key -> MountOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MountOptions" (MountOptionsProperty -> (Key, Value))
-> Maybe MountOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MountOptionsProperty
mountOptions,
                  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
"Password" (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)
password,
                  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
"ServerHostname" (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)
serverHostname,
                  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
"Subdirectory" (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)
subdirectory,
                  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,
                  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
"User" (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)
user])))
instance Property "AgentArns" LocationSMB where
  type PropertyType "AgentArns" LocationSMB = ValueList Prelude.Text
  set :: PropertyType "AgentArns" LocationSMB -> LocationSMB -> LocationSMB
set PropertyType "AgentArns" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {agentArns :: ValueList Text
agentArns = PropertyType "AgentArns" LocationSMB
ValueList Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
haddock_workaround_ :: ()
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "AuthenticationType" LocationSMB where
  type PropertyType "AuthenticationType" LocationSMB = Value Prelude.Text
  set :: PropertyType "AuthenticationType" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "AuthenticationType" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {authenticationType :: Maybe (Value Text)
authenticationType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AuthenticationType" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "CmkSecretConfig" LocationSMB where
  type PropertyType "CmkSecretConfig" LocationSMB = CmkSecretConfigProperty
  set :: PropertyType "CmkSecretConfig" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "CmkSecretConfig" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {cmkSecretConfig :: Maybe CmkSecretConfigProperty
cmkSecretConfig = CmkSecretConfigProperty -> Maybe CmkSecretConfigProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CmkSecretConfig" LocationSMB
CmkSecretConfigProperty
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "CustomSecretConfig" LocationSMB where
  type PropertyType "CustomSecretConfig" LocationSMB = CustomSecretConfigProperty
  set :: PropertyType "CustomSecretConfig" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "CustomSecretConfig" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {customSecretConfig :: Maybe CustomSecretConfigProperty
customSecretConfig = CustomSecretConfigProperty -> Maybe CustomSecretConfigProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CustomSecretConfig" LocationSMB
CustomSecretConfigProperty
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "DnsIpAddresses" LocationSMB where
  type PropertyType "DnsIpAddresses" LocationSMB = ValueList Prelude.Text
  set :: PropertyType "DnsIpAddresses" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "DnsIpAddresses" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {dnsIpAddresses :: Maybe (ValueList Text)
dnsIpAddresses = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DnsIpAddresses" LocationSMB
ValueList Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "Domain" LocationSMB where
  type PropertyType "Domain" LocationSMB = Value Prelude.Text
  set :: PropertyType "Domain" LocationSMB -> LocationSMB -> LocationSMB
set PropertyType "Domain" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {domain :: Maybe (Value Text)
domain = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Domain" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "KerberosKeytab" LocationSMB where
  type PropertyType "KerberosKeytab" LocationSMB = Value Prelude.Text
  set :: PropertyType "KerberosKeytab" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "KerberosKeytab" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {kerberosKeytab :: Maybe (Value Text)
kerberosKeytab = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "KerberosKeytab" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "KerberosKrb5Conf" LocationSMB where
  type PropertyType "KerberosKrb5Conf" LocationSMB = Value Prelude.Text
  set :: PropertyType "KerberosKrb5Conf" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "KerberosKrb5Conf" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {kerberosKrb5Conf :: Maybe (Value Text)
kerberosKrb5Conf = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "KerberosKrb5Conf" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "KerberosPrincipal" LocationSMB where
  type PropertyType "KerberosPrincipal" LocationSMB = Value Prelude.Text
  set :: PropertyType "KerberosPrincipal" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "KerberosPrincipal" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {kerberosPrincipal :: Maybe (Value Text)
kerberosPrincipal = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "KerberosPrincipal" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "MountOptions" LocationSMB where
  type PropertyType "MountOptions" LocationSMB = MountOptionsProperty
  set :: PropertyType "MountOptions" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "MountOptions" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {mountOptions :: Maybe MountOptionsProperty
mountOptions = MountOptionsProperty -> Maybe MountOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MountOptions" LocationSMB
MountOptionsProperty
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "Password" LocationSMB where
  type PropertyType "Password" LocationSMB = Value Prelude.Text
  set :: PropertyType "Password" LocationSMB -> LocationSMB -> LocationSMB
set PropertyType "Password" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {password :: Maybe (Value Text)
password = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Password" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "ServerHostname" LocationSMB where
  type PropertyType "ServerHostname" LocationSMB = Value Prelude.Text
  set :: PropertyType "ServerHostname" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "ServerHostname" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {serverHostname :: Maybe (Value Text)
serverHostname = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ServerHostname" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "Subdirectory" LocationSMB where
  type PropertyType "Subdirectory" LocationSMB = Value Prelude.Text
  set :: PropertyType "Subdirectory" LocationSMB
-> LocationSMB -> LocationSMB
set PropertyType "Subdirectory" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {subdirectory :: Maybe (Value Text)
subdirectory = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Subdirectory" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
instance Property "Tags" LocationSMB where
  type PropertyType "Tags" LocationSMB = [Tag]
  set :: PropertyType "Tags" LocationSMB -> LocationSMB -> LocationSMB
set PropertyType "Tags" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {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" LocationSMB
newValue, Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
user :: Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
user :: Maybe (Value Text)
..}
instance Property "User" LocationSMB where
  type PropertyType "User" LocationSMB = Value Prelude.Text
  set :: PropertyType "User" LocationSMB -> LocationSMB -> LocationSMB
set PropertyType "User" LocationSMB
newValue LocationSMB {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: LocationSMB -> ()
agentArns :: LocationSMB -> ValueList Text
authenticationType :: LocationSMB -> Maybe (Value Text)
cmkSecretConfig :: LocationSMB -> Maybe CmkSecretConfigProperty
customSecretConfig :: LocationSMB -> Maybe CustomSecretConfigProperty
dnsIpAddresses :: LocationSMB -> Maybe (ValueList Text)
domain :: LocationSMB -> Maybe (Value Text)
kerberosKeytab :: LocationSMB -> Maybe (Value Text)
kerberosKrb5Conf :: LocationSMB -> Maybe (Value Text)
kerberosPrincipal :: LocationSMB -> Maybe (Value Text)
mountOptions :: LocationSMB -> Maybe MountOptionsProperty
password :: LocationSMB -> Maybe (Value Text)
serverHostname :: LocationSMB -> Maybe (Value Text)
subdirectory :: LocationSMB -> Maybe (Value Text)
tags :: LocationSMB -> Maybe [Tag]
user :: LocationSMB -> Maybe (Value Text)
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
user :: Maybe (Value Text)
..}
    = LocationSMB {user :: Maybe (Value Text)
user = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "User" LocationSMB
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CmkSecretConfigProperty
Maybe CustomSecretConfigProperty
Maybe MountOptionsProperty
()
ValueList Text
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
agentArns :: ValueList Text
authenticationType :: Maybe (Value Text)
cmkSecretConfig :: Maybe CmkSecretConfigProperty
customSecretConfig :: Maybe CustomSecretConfigProperty
dnsIpAddresses :: Maybe (ValueList Text)
domain :: Maybe (Value Text)
kerberosKeytab :: Maybe (Value Text)
kerberosKrb5Conf :: Maybe (Value Text)
kerberosPrincipal :: Maybe (Value Text)
mountOptions :: Maybe MountOptionsProperty
password :: Maybe (Value Text)
serverHostname :: Maybe (Value Text)
subdirectory :: Maybe (Value Text)
tags :: Maybe [Tag]
..}