module Kubernetes.Model.V1.AWSElasticBlockStoreVolumeSource
( AWSElasticBlockStoreVolumeSource (..)
, volumeID
, fsType
, partition
, readOnly
, mkAWSElasticBlockStoreVolumeSource
) where
import Control.Lens.TH (makeLenses)
import Data.Aeson.TH (defaultOptions, deriveJSON,
fieldLabelModifier)
import Data.Text (Text)
import GHC.Generics (Generic)
import Prelude hiding (drop, error, max, min)
import qualified Prelude as P
import Test.QuickCheck (Arbitrary, arbitrary)
import Test.QuickCheck.Instances ()
data AWSElasticBlockStoreVolumeSource = AWSElasticBlockStoreVolumeSource
{ _volumeID :: !(Text)
, _fsType :: !(Text)
, _partition :: !(Maybe Integer)
, _readOnly :: !(Maybe Bool)
} deriving (Show, Eq, Generic)
makeLenses ''AWSElasticBlockStoreVolumeSource
$(deriveJSON defaultOptions{fieldLabelModifier = (\n -> if n == "_type_" then "type" else P.drop 1 n)} ''AWSElasticBlockStoreVolumeSource)
instance Arbitrary AWSElasticBlockStoreVolumeSource where
arbitrary = AWSElasticBlockStoreVolumeSource <$> arbitrary <*> arbitrary <*> arbitrary <*> arbitrary
mkAWSElasticBlockStoreVolumeSource :: Text -> Text -> AWSElasticBlockStoreVolumeSource
mkAWSElasticBlockStoreVolumeSource xvolumeIDx xfsTypex = AWSElasticBlockStoreVolumeSource xvolumeIDx xfsTypex Nothing Nothing