{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MonoLocalBinds #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-name-shadowing -fno-warn-unused-binds -fno-warn-unused-imports #-}
module Kubernetes.OpenAPI.API.StorageV1 where
import Kubernetes.OpenAPI.Core
import Kubernetes.OpenAPI.MimeTypes
import Kubernetes.OpenAPI.Model as M
import qualified Data.Aeson as A
import qualified Data.ByteString as B
import qualified Data.ByteString.Lazy as BL
import qualified Data.Data as P (Typeable, TypeRep, typeOf, typeRep)
import qualified Data.Foldable as P
import qualified Data.Map as Map
import qualified Data.Maybe as P
import qualified Data.Proxy as P (Proxy(..))
import qualified Data.Set as Set
import qualified Data.String as P
import qualified Data.Text as T
import qualified Data.Text.Encoding as T
import qualified Data.Text.Lazy as TL
import qualified Data.Text.Lazy.Encoding as TL
import qualified Data.Time as TI
import qualified Network.HTTP.Client.MultipartFormData as NH
import qualified Network.HTTP.Media as ME
import qualified Network.HTTP.Types as NH
import qualified Web.FormUrlEncoded as WH
import qualified Web.HttpApiData as WH
import Data.Text (Text)
import GHC.Base ((<|>))
import Prelude ((==),(/=),($), (.),(<$>),(<*>),(>>=),Maybe(..),Bool(..),Char,Double,FilePath,Float,Int,Integer,String,fmap,undefined,mempty,maybe,pure,Monad,Applicative,Functor)
import qualified Prelude as P
createCSIDriver
:: (Consumes CreateCSIDriver contentType, MimeRender contentType V1CSIDriver)
=> ContentType contentType
-> Accept accept
-> V1CSIDriver
-> KubernetesRequest CreateCSIDriver contentType V1CSIDriver accept
createCSIDriver :: forall contentType accept.
(Consumes CreateCSIDriver contentType,
MimeRender contentType V1CSIDriver) =>
ContentType contentType
-> Accept accept
-> V1CSIDriver
-> KubernetesRequest CreateCSIDriver contentType V1CSIDriver accept
createCSIDriver ContentType contentType
_ Accept accept
_ V1CSIDriver
body =
Method
-> [ByteString]
-> KubernetesRequest CreateCSIDriver contentType V1CSIDriver accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"POST" [ByteString
"/apis/storage.k8s.io/v1/csidrivers"]
KubernetesRequest CreateCSIDriver contentType V1CSIDriver accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest CreateCSIDriver contentType V1CSIDriver accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest CreateCSIDriver contentType V1CSIDriver accept
-> V1CSIDriver
-> KubernetesRequest CreateCSIDriver contentType V1CSIDriver accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes CreateCSIDriver contentType,
MimeRender contentType V1CSIDriver) =>
KubernetesRequest CreateCSIDriver contentType res accept
-> V1CSIDriver
-> KubernetesRequest CreateCSIDriver contentType res accept
`setBodyParam` V1CSIDriver
body
data CreateCSIDriver
instance HasBodyParam CreateCSIDriver V1CSIDriver
instance HasOptionalParam CreateCSIDriver Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateCSIDriver contentType res accept
-> Pretty
-> KubernetesRequest CreateCSIDriver contentType res accept
applyOptionalParam KubernetesRequest CreateCSIDriver contentType res accept
req (Pretty Text
xs) =
KubernetesRequest CreateCSIDriver contentType res accept
req KubernetesRequest CreateCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateCSIDriver DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateCSIDriver contentType res accept
-> DryRun
-> KubernetesRequest CreateCSIDriver contentType res accept
applyOptionalParam KubernetesRequest CreateCSIDriver contentType res accept
req (DryRun Text
xs) =
KubernetesRequest CreateCSIDriver contentType res accept
req KubernetesRequest CreateCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateCSIDriver FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateCSIDriver contentType res accept
-> FieldManager
-> KubernetesRequest CreateCSIDriver contentType res accept
applyOptionalParam KubernetesRequest CreateCSIDriver contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest CreateCSIDriver contentType res accept
req KubernetesRequest CreateCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateCSIDriver FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateCSIDriver contentType res accept
-> FieldValidation
-> KubernetesRequest CreateCSIDriver contentType res accept
applyOptionalParam KubernetesRequest CreateCSIDriver contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest CreateCSIDriver contentType res accept
req KubernetesRequest CreateCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes CreateCSIDriver mtype
instance Produces CreateCSIDriver MimeJSON
instance Produces CreateCSIDriver MimeVndKubernetesProtobuf
instance Produces CreateCSIDriver MimeCbor
instance Produces CreateCSIDriver MimeYaml
createCSINode
:: (Consumes CreateCSINode contentType, MimeRender contentType V1CSINode)
=> ContentType contentType
-> Accept accept
-> V1CSINode
-> KubernetesRequest CreateCSINode contentType V1CSINode accept
createCSINode :: forall contentType accept.
(Consumes CreateCSINode contentType,
MimeRender contentType V1CSINode) =>
ContentType contentType
-> Accept accept
-> V1CSINode
-> KubernetesRequest CreateCSINode contentType V1CSINode accept
createCSINode ContentType contentType
_ Accept accept
_ V1CSINode
body =
Method
-> [ByteString]
-> KubernetesRequest CreateCSINode contentType V1CSINode accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"POST" [ByteString
"/apis/storage.k8s.io/v1/csinodes"]
KubernetesRequest CreateCSINode contentType V1CSINode accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest CreateCSINode contentType V1CSINode accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest CreateCSINode contentType V1CSINode accept
-> V1CSINode
-> KubernetesRequest CreateCSINode contentType V1CSINode accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes CreateCSINode contentType,
MimeRender contentType V1CSINode) =>
KubernetesRequest CreateCSINode contentType res accept
-> V1CSINode
-> KubernetesRequest CreateCSINode contentType res accept
`setBodyParam` V1CSINode
body
data CreateCSINode
instance HasBodyParam CreateCSINode V1CSINode
instance HasOptionalParam CreateCSINode Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateCSINode contentType res accept
-> Pretty -> KubernetesRequest CreateCSINode contentType res accept
applyOptionalParam KubernetesRequest CreateCSINode contentType res accept
req (Pretty Text
xs) =
KubernetesRequest CreateCSINode contentType res accept
req KubernetesRequest CreateCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateCSINode DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateCSINode contentType res accept
-> DryRun -> KubernetesRequest CreateCSINode contentType res accept
applyOptionalParam KubernetesRequest CreateCSINode contentType res accept
req (DryRun Text
xs) =
KubernetesRequest CreateCSINode contentType res accept
req KubernetesRequest CreateCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateCSINode FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateCSINode contentType res accept
-> FieldManager
-> KubernetesRequest CreateCSINode contentType res accept
applyOptionalParam KubernetesRequest CreateCSINode contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest CreateCSINode contentType res accept
req KubernetesRequest CreateCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateCSINode FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateCSINode contentType res accept
-> FieldValidation
-> KubernetesRequest CreateCSINode contentType res accept
applyOptionalParam KubernetesRequest CreateCSINode contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest CreateCSINode contentType res accept
req KubernetesRequest CreateCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes CreateCSINode mtype
instance Produces CreateCSINode MimeJSON
instance Produces CreateCSINode MimeVndKubernetesProtobuf
instance Produces CreateCSINode MimeCbor
instance Produces CreateCSINode MimeYaml
createNamespacedCSIStorageCapacity
:: (Consumes CreateNamespacedCSIStorageCapacity contentType, MimeRender contentType V1CSIStorageCapacity)
=> ContentType contentType
-> Accept accept
-> V1CSIStorageCapacity
-> Namespace
-> KubernetesRequest CreateNamespacedCSIStorageCapacity contentType V1CSIStorageCapacity accept
createNamespacedCSIStorageCapacity :: forall contentType accept.
(Consumes CreateNamespacedCSIStorageCapacity contentType,
MimeRender contentType V1CSIStorageCapacity) =>
ContentType contentType
-> Accept accept
-> V1CSIStorageCapacity
-> Namespace
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
createNamespacedCSIStorageCapacity ContentType contentType
_ Accept accept
_ V1CSIStorageCapacity
body (Namespace Text
namespace) =
Method
-> [ByteString]
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"POST" [ByteString
"/apis/storage.k8s.io/v1/namespaces/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
namespace,ByteString
"/csistoragecapacities"]
KubernetesRequest
CreateNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
CreateNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
-> V1CSIStorageCapacity
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes CreateNamespacedCSIStorageCapacity contentType,
MimeRender contentType V1CSIStorageCapacity) =>
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> V1CSIStorageCapacity
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
`setBodyParam` V1CSIStorageCapacity
body
data CreateNamespacedCSIStorageCapacity
instance HasBodyParam CreateNamespacedCSIStorageCapacity V1CSIStorageCapacity
instance HasOptionalParam CreateNamespacedCSIStorageCapacity Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> Pretty
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateNamespacedCSIStorageCapacity DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> DryRun
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateNamespacedCSIStorageCapacity FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> FieldManager
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateNamespacedCSIStorageCapacity FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> FieldValidation
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
CreateNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes CreateNamespacedCSIStorageCapacity mtype
instance Produces CreateNamespacedCSIStorageCapacity MimeJSON
instance Produces CreateNamespacedCSIStorageCapacity MimeVndKubernetesProtobuf
instance Produces CreateNamespacedCSIStorageCapacity MimeCbor
instance Produces CreateNamespacedCSIStorageCapacity MimeYaml
createStorageClass
:: (Consumes CreateStorageClass contentType, MimeRender contentType V1StorageClass)
=> ContentType contentType
-> Accept accept
-> V1StorageClass
-> KubernetesRequest CreateStorageClass contentType V1StorageClass accept
createStorageClass :: forall contentType accept.
(Consumes CreateStorageClass contentType,
MimeRender contentType V1StorageClass) =>
ContentType contentType
-> Accept accept
-> V1StorageClass
-> KubernetesRequest
CreateStorageClass contentType V1StorageClass accept
createStorageClass ContentType contentType
_ Accept accept
_ V1StorageClass
body =
Method
-> [ByteString]
-> KubernetesRequest
CreateStorageClass contentType V1StorageClass accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"POST" [ByteString
"/apis/storage.k8s.io/v1/storageclasses"]
KubernetesRequest
CreateStorageClass contentType V1StorageClass accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
CreateStorageClass contentType V1StorageClass accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
CreateStorageClass contentType V1StorageClass accept
-> V1StorageClass
-> KubernetesRequest
CreateStorageClass contentType V1StorageClass accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes CreateStorageClass contentType,
MimeRender contentType V1StorageClass) =>
KubernetesRequest CreateStorageClass contentType res accept
-> V1StorageClass
-> KubernetesRequest CreateStorageClass contentType res accept
`setBodyParam` V1StorageClass
body
data CreateStorageClass
instance HasBodyParam CreateStorageClass V1StorageClass
instance HasOptionalParam CreateStorageClass Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateStorageClass contentType res accept
-> Pretty
-> KubernetesRequest CreateStorageClass contentType res accept
applyOptionalParam KubernetesRequest CreateStorageClass contentType res accept
req (Pretty Text
xs) =
KubernetesRequest CreateStorageClass contentType res accept
req KubernetesRequest CreateStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateStorageClass DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateStorageClass contentType res accept
-> DryRun
-> KubernetesRequest CreateStorageClass contentType res accept
applyOptionalParam KubernetesRequest CreateStorageClass contentType res accept
req (DryRun Text
xs) =
KubernetesRequest CreateStorageClass contentType res accept
req KubernetesRequest CreateStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateStorageClass FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateStorageClass contentType res accept
-> FieldManager
-> KubernetesRequest CreateStorageClass contentType res accept
applyOptionalParam KubernetesRequest CreateStorageClass contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest CreateStorageClass contentType res accept
req KubernetesRequest CreateStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateStorageClass FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateStorageClass contentType res accept
-> FieldValidation
-> KubernetesRequest CreateStorageClass contentType res accept
applyOptionalParam KubernetesRequest CreateStorageClass contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest CreateStorageClass contentType res accept
req KubernetesRequest CreateStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes CreateStorageClass mtype
instance Produces CreateStorageClass MimeJSON
instance Produces CreateStorageClass MimeVndKubernetesProtobuf
instance Produces CreateStorageClass MimeCbor
instance Produces CreateStorageClass MimeYaml
createVolumeAttachment
:: (Consumes CreateVolumeAttachment contentType, MimeRender contentType V1VolumeAttachment)
=> ContentType contentType
-> Accept accept
-> V1VolumeAttachment
-> KubernetesRequest CreateVolumeAttachment contentType V1VolumeAttachment accept
createVolumeAttachment :: forall contentType accept.
(Consumes CreateVolumeAttachment contentType,
MimeRender contentType V1VolumeAttachment) =>
ContentType contentType
-> Accept accept
-> V1VolumeAttachment
-> KubernetesRequest
CreateVolumeAttachment contentType V1VolumeAttachment accept
createVolumeAttachment ContentType contentType
_ Accept accept
_ V1VolumeAttachment
body =
Method
-> [ByteString]
-> KubernetesRequest
CreateVolumeAttachment contentType V1VolumeAttachment accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"POST" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments"]
KubernetesRequest
CreateVolumeAttachment contentType V1VolumeAttachment accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
CreateVolumeAttachment contentType V1VolumeAttachment accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
CreateVolumeAttachment contentType V1VolumeAttachment accept
-> V1VolumeAttachment
-> KubernetesRequest
CreateVolumeAttachment contentType V1VolumeAttachment accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes CreateVolumeAttachment contentType,
MimeRender contentType V1VolumeAttachment) =>
KubernetesRequest CreateVolumeAttachment contentType res accept
-> V1VolumeAttachment
-> KubernetesRequest CreateVolumeAttachment contentType res accept
`setBodyParam` V1VolumeAttachment
body
data CreateVolumeAttachment
instance HasBodyParam CreateVolumeAttachment V1VolumeAttachment
instance HasOptionalParam CreateVolumeAttachment Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateVolumeAttachment contentType res accept
-> Pretty
-> KubernetesRequest CreateVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest CreateVolumeAttachment contentType res accept
req (Pretty Text
xs) =
KubernetesRequest CreateVolumeAttachment contentType res accept
req KubernetesRequest CreateVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateVolumeAttachment DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateVolumeAttachment contentType res accept
-> DryRun
-> KubernetesRequest CreateVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest CreateVolumeAttachment contentType res accept
req (DryRun Text
xs) =
KubernetesRequest CreateVolumeAttachment contentType res accept
req KubernetesRequest CreateVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateVolumeAttachment FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateVolumeAttachment contentType res accept
-> FieldManager
-> KubernetesRequest CreateVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest CreateVolumeAttachment contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest CreateVolumeAttachment contentType res accept
req KubernetesRequest CreateVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam CreateVolumeAttachment FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest CreateVolumeAttachment contentType res accept
-> FieldValidation
-> KubernetesRequest CreateVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest CreateVolumeAttachment contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest CreateVolumeAttachment contentType res accept
req KubernetesRequest CreateVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest CreateVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes CreateVolumeAttachment mtype
instance Produces CreateVolumeAttachment MimeJSON
instance Produces CreateVolumeAttachment MimeVndKubernetesProtobuf
instance Produces CreateVolumeAttachment MimeCbor
instance Produces CreateVolumeAttachment MimeYaml
deleteCSIDriver
:: (Consumes DeleteCSIDriver contentType)
=> ContentType contentType
-> Accept accept
-> Name
-> KubernetesRequest DeleteCSIDriver contentType V1CSIDriver accept
deleteCSIDriver :: forall contentType accept.
Consumes DeleteCSIDriver contentType =>
ContentType contentType
-> Accept accept
-> Name
-> KubernetesRequest DeleteCSIDriver contentType V1CSIDriver accept
deleteCSIDriver ContentType contentType
_ Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest DeleteCSIDriver contentType V1CSIDriver accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/csidrivers/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest DeleteCSIDriver contentType V1CSIDriver accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest DeleteCSIDriver contentType V1CSIDriver accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteCSIDriver
instance HasBodyParam DeleteCSIDriver V1DeleteOptions
instance HasOptionalParam DeleteCSIDriver Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSIDriver contentType res accept
-> Pretty
-> KubernetesRequest DeleteCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCSIDriver contentType res accept
req (Pretty Text
xs) =
KubernetesRequest DeleteCSIDriver contentType res accept
req KubernetesRequest DeleteCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCSIDriver DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSIDriver contentType res accept
-> DryRun
-> KubernetesRequest DeleteCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCSIDriver contentType res accept
req (DryRun Text
xs) =
KubernetesRequest DeleteCSIDriver contentType res accept
req KubernetesRequest DeleteCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCSIDriver GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSIDriver contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest DeleteCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCSIDriver contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest DeleteCSIDriver contentType res accept
req KubernetesRequest DeleteCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCSIDriver IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSIDriver contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest DeleteCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCSIDriver contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest DeleteCSIDriver contentType res accept
req KubernetesRequest DeleteCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCSIDriver OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSIDriver contentType res accept
-> OrphanDependents
-> KubernetesRequest DeleteCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCSIDriver contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest DeleteCSIDriver contentType res accept
req KubernetesRequest DeleteCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCSIDriver PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSIDriver contentType res accept
-> PropagationPolicy
-> KubernetesRequest DeleteCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCSIDriver contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest DeleteCSIDriver contentType res accept
req KubernetesRequest DeleteCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes DeleteCSIDriver mtype
instance Produces DeleteCSIDriver MimeJSON
instance Produces DeleteCSIDriver MimeVndKubernetesProtobuf
instance Produces DeleteCSIDriver MimeCbor
instance Produces DeleteCSIDriver MimeYaml
deleteCSINode
:: (Consumes DeleteCSINode contentType)
=> ContentType contentType
-> Accept accept
-> Name
-> KubernetesRequest DeleteCSINode contentType V1CSINode accept
deleteCSINode :: forall contentType accept.
Consumes DeleteCSINode contentType =>
ContentType contentType
-> Accept accept
-> Name
-> KubernetesRequest DeleteCSINode contentType V1CSINode accept
deleteCSINode ContentType contentType
_ Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest DeleteCSINode contentType V1CSINode accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/csinodes/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest DeleteCSINode contentType V1CSINode accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest DeleteCSINode contentType V1CSINode accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteCSINode
instance HasBodyParam DeleteCSINode V1DeleteOptions
instance HasOptionalParam DeleteCSINode Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSINode contentType res accept
-> Pretty -> KubernetesRequest DeleteCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCSINode contentType res accept
req (Pretty Text
xs) =
KubernetesRequest DeleteCSINode contentType res accept
req KubernetesRequest DeleteCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCSINode DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSINode contentType res accept
-> DryRun -> KubernetesRequest DeleteCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCSINode contentType res accept
req (DryRun Text
xs) =
KubernetesRequest DeleteCSINode contentType res accept
req KubernetesRequest DeleteCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCSINode GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSINode contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest DeleteCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCSINode contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest DeleteCSINode contentType res accept
req KubernetesRequest DeleteCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCSINode IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSINode contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest DeleteCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCSINode contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest DeleteCSINode contentType res accept
req KubernetesRequest DeleteCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCSINode OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSINode contentType res accept
-> OrphanDependents
-> KubernetesRequest DeleteCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCSINode contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest DeleteCSINode contentType res accept
req KubernetesRequest DeleteCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCSINode PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCSINode contentType res accept
-> PropagationPolicy
-> KubernetesRequest DeleteCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCSINode contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest DeleteCSINode contentType res accept
req KubernetesRequest DeleteCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes DeleteCSINode mtype
instance Produces DeleteCSINode MimeJSON
instance Produces DeleteCSINode MimeVndKubernetesProtobuf
instance Produces DeleteCSINode MimeCbor
instance Produces DeleteCSINode MimeYaml
deleteCollectionCSIDriver
:: (Consumes DeleteCollectionCSIDriver contentType)
=> ContentType contentType
-> Accept accept
-> KubernetesRequest DeleteCollectionCSIDriver contentType V1Status accept
deleteCollectionCSIDriver :: forall contentType accept.
Consumes DeleteCollectionCSIDriver contentType =>
ContentType contentType
-> Accept accept
-> KubernetesRequest
DeleteCollectionCSIDriver contentType V1Status accept
deleteCollectionCSIDriver ContentType contentType
_ Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType V1Status accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/csidrivers"]
KubernetesRequest
DeleteCollectionCSIDriver contentType V1Status accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
DeleteCollectionCSIDriver contentType V1Status accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteCollectionCSIDriver
instance HasBodyParam DeleteCollectionCSIDriver V1DeleteOptions
instance HasOptionalParam DeleteCollectionCSIDriver Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> Pretty
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (Pretty Text
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSIDriver Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> Continue
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (Continue Text
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSIDriver DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> DryRun
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (DryRun Text
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSIDriver FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> FieldSelector
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSIDriver GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionCSIDriver IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionCSIDriver LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> LabelSelector
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSIDriver Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> Limit
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (Limit Int
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionCSIDriver OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> OrphanDependents
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionCSIDriver PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> PropagationPolicy
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSIDriver ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> ResourceVersion
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSIDriver ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSIDriver SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> SendInitialEvents
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionCSIDriver TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> TimeoutSeconds
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest DeleteCollectionCSIDriver contentType res accept
req KubernetesRequest DeleteCollectionCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance MimeType mtype => Consumes DeleteCollectionCSIDriver mtype
instance Produces DeleteCollectionCSIDriver MimeJSON
instance Produces DeleteCollectionCSIDriver MimeVndKubernetesProtobuf
instance Produces DeleteCollectionCSIDriver MimeCbor
instance Produces DeleteCollectionCSIDriver MimeYaml
deleteCollectionCSINode
:: (Consumes DeleteCollectionCSINode contentType)
=> ContentType contentType
-> Accept accept
-> KubernetesRequest DeleteCollectionCSINode contentType V1Status accept
deleteCollectionCSINode :: forall contentType accept.
Consumes DeleteCollectionCSINode contentType =>
ContentType contentType
-> Accept accept
-> KubernetesRequest
DeleteCollectionCSINode contentType V1Status accept
deleteCollectionCSINode ContentType contentType
_ Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
DeleteCollectionCSINode contentType V1Status accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/csinodes"]
KubernetesRequest
DeleteCollectionCSINode contentType V1Status accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
DeleteCollectionCSINode contentType V1Status accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteCollectionCSINode
instance HasBodyParam DeleteCollectionCSINode V1DeleteOptions
instance HasOptionalParam DeleteCollectionCSINode Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> Pretty
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (Pretty Text
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSINode Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> Continue
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (Continue Text
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSINode DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> DryRun
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (DryRun Text
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSINode FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> FieldSelector
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSINode GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionCSINode IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionCSINode LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> LabelSelector
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSINode Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> Limit
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (Limit Int
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionCSINode OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> OrphanDependents
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionCSINode PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> PropagationPolicy
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSINode ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> ResourceVersion
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSINode ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionCSINode SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> SendInitialEvents
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionCSINode TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteCollectionCSINode contentType res accept
-> TimeoutSeconds
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
applyOptionalParam KubernetesRequest DeleteCollectionCSINode contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest DeleteCollectionCSINode contentType res accept
req KubernetesRequest DeleteCollectionCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteCollectionCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance MimeType mtype => Consumes DeleteCollectionCSINode mtype
instance Produces DeleteCollectionCSINode MimeJSON
instance Produces DeleteCollectionCSINode MimeVndKubernetesProtobuf
instance Produces DeleteCollectionCSINode MimeCbor
instance Produces DeleteCollectionCSINode MimeYaml
deleteCollectionNamespacedCSIStorageCapacity
:: (Consumes DeleteCollectionNamespacedCSIStorageCapacity contentType)
=> ContentType contentType
-> Accept accept
-> Namespace
-> KubernetesRequest DeleteCollectionNamespacedCSIStorageCapacity contentType V1Status accept
deleteCollectionNamespacedCSIStorageCapacity :: forall contentType accept.
Consumes
DeleteCollectionNamespacedCSIStorageCapacity contentType =>
ContentType contentType
-> Accept accept
-> Namespace
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity
contentType
V1Status
accept
deleteCollectionNamespacedCSIStorageCapacity ContentType contentType
_ Accept accept
_ (Namespace Text
namespace) =
Method
-> [ByteString]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity
contentType
V1Status
accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/namespaces/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
namespace,ByteString
"/csistoragecapacities"]
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity
contentType
V1Status
accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity
contentType
V1Status
accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteCollectionNamespacedCSIStorageCapacity
instance HasBodyParam DeleteCollectionNamespacedCSIStorageCapacity V1DeleteOptions
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> Pretty
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> Continue
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (Continue Text
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> DryRun
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> FieldSelector
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> LabelSelector
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> Limit
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (Limit Int
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> OrphanDependents
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> PropagationPolicy
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> ResourceVersion
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> SendInitialEvents
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionNamespacedCSIStorageCapacity TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> TimeoutSeconds
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance MimeType mtype => Consumes DeleteCollectionNamespacedCSIStorageCapacity mtype
instance Produces DeleteCollectionNamespacedCSIStorageCapacity MimeJSON
instance Produces DeleteCollectionNamespacedCSIStorageCapacity MimeVndKubernetesProtobuf
instance Produces DeleteCollectionNamespacedCSIStorageCapacity MimeCbor
instance Produces DeleteCollectionNamespacedCSIStorageCapacity MimeYaml
deleteCollectionStorageClass
:: (Consumes DeleteCollectionStorageClass contentType)
=> ContentType contentType
-> Accept accept
-> KubernetesRequest DeleteCollectionStorageClass contentType V1Status accept
deleteCollectionStorageClass :: forall contentType accept.
Consumes DeleteCollectionStorageClass contentType =>
ContentType contentType
-> Accept accept
-> KubernetesRequest
DeleteCollectionStorageClass contentType V1Status accept
deleteCollectionStorageClass ContentType contentType
_ Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
DeleteCollectionStorageClass contentType V1Status accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/storageclasses"]
KubernetesRequest
DeleteCollectionStorageClass contentType V1Status accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
DeleteCollectionStorageClass contentType V1Status accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteCollectionStorageClass
instance HasBodyParam DeleteCollectionStorageClass V1DeleteOptions
instance HasOptionalParam DeleteCollectionStorageClass Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> Pretty
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionStorageClass Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> Continue
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (Continue Text
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionStorageClass DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> DryRun
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionStorageClass FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> FieldSelector
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionStorageClass GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionStorageClass IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionStorageClass LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> LabelSelector
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionStorageClass Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> Limit
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (Limit Int
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionStorageClass OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> OrphanDependents
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionStorageClass PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> PropagationPolicy
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionStorageClass ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> ResourceVersion
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionStorageClass ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionStorageClass SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> SendInitialEvents
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionStorageClass TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> TimeoutSeconds
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest
DeleteCollectionStorageClass contentType res accept
req KubernetesRequest
DeleteCollectionStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance MimeType mtype => Consumes DeleteCollectionStorageClass mtype
instance Produces DeleteCollectionStorageClass MimeJSON
instance Produces DeleteCollectionStorageClass MimeVndKubernetesProtobuf
instance Produces DeleteCollectionStorageClass MimeCbor
instance Produces DeleteCollectionStorageClass MimeYaml
deleteCollectionVolumeAttachment
:: (Consumes DeleteCollectionVolumeAttachment contentType)
=> ContentType contentType
-> Accept accept
-> KubernetesRequest DeleteCollectionVolumeAttachment contentType V1Status accept
deleteCollectionVolumeAttachment :: forall contentType accept.
Consumes DeleteCollectionVolumeAttachment contentType =>
ContentType contentType
-> Accept accept
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType V1Status accept
deleteCollectionVolumeAttachment ContentType contentType
_ Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType V1Status accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments"]
KubernetesRequest
DeleteCollectionVolumeAttachment contentType V1Status accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType V1Status accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteCollectionVolumeAttachment
instance HasBodyParam DeleteCollectionVolumeAttachment V1DeleteOptions
instance HasOptionalParam DeleteCollectionVolumeAttachment Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> Pretty
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> Continue
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (Continue Text
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> DryRun
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> FieldSelector
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> LabelSelector
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> Limit
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (Limit Int
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> OrphanDependents
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> PropagationPolicy
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> ResourceVersion
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> SendInitialEvents
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteCollectionVolumeAttachment TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> TimeoutSeconds
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
req KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteCollectionVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance MimeType mtype => Consumes DeleteCollectionVolumeAttachment mtype
instance Produces DeleteCollectionVolumeAttachment MimeJSON
instance Produces DeleteCollectionVolumeAttachment MimeVndKubernetesProtobuf
instance Produces DeleteCollectionVolumeAttachment MimeCbor
instance Produces DeleteCollectionVolumeAttachment MimeYaml
deleteNamespacedCSIStorageCapacity
:: (Consumes DeleteNamespacedCSIStorageCapacity contentType)
=> ContentType contentType
-> Accept accept
-> Name
-> Namespace
-> KubernetesRequest DeleteNamespacedCSIStorageCapacity contentType V1Status accept
deleteNamespacedCSIStorageCapacity :: forall contentType accept.
Consumes DeleteNamespacedCSIStorageCapacity contentType =>
ContentType contentType
-> Accept accept
-> Name
-> Namespace
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType V1Status accept
deleteNamespacedCSIStorageCapacity ContentType contentType
_ Accept accept
_ (Name Text
name) (Namespace Text
namespace) =
Method
-> [ByteString]
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType V1Status accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/namespaces/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
namespace,ByteString
"/csistoragecapacities/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType V1Status accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType V1Status accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteNamespacedCSIStorageCapacity
instance HasBodyParam DeleteNamespacedCSIStorageCapacity V1DeleteOptions
instance HasOptionalParam DeleteNamespacedCSIStorageCapacity Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> Pretty
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteNamespacedCSIStorageCapacity DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> DryRun
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteNamespacedCSIStorageCapacity GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteNamespacedCSIStorageCapacity IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteNamespacedCSIStorageCapacity OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> OrphanDependents
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteNamespacedCSIStorageCapacity PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> PropagationPolicy
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
DeleteNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes DeleteNamespacedCSIStorageCapacity mtype
instance Produces DeleteNamespacedCSIStorageCapacity MimeJSON
instance Produces DeleteNamespacedCSIStorageCapacity MimeVndKubernetesProtobuf
instance Produces DeleteNamespacedCSIStorageCapacity MimeCbor
instance Produces DeleteNamespacedCSIStorageCapacity MimeYaml
deleteStorageClass
:: (Consumes DeleteStorageClass contentType)
=> ContentType contentType
-> Accept accept
-> Name
-> KubernetesRequest DeleteStorageClass contentType V1StorageClass accept
deleteStorageClass :: forall contentType accept.
Consumes DeleteStorageClass contentType =>
ContentType contentType
-> Accept accept
-> Name
-> KubernetesRequest
DeleteStorageClass contentType V1StorageClass accept
deleteStorageClass ContentType contentType
_ Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
DeleteStorageClass contentType V1StorageClass accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/storageclasses/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
DeleteStorageClass contentType V1StorageClass accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
DeleteStorageClass contentType V1StorageClass accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteStorageClass
instance HasBodyParam DeleteStorageClass V1DeleteOptions
instance HasOptionalParam DeleteStorageClass Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteStorageClass contentType res accept
-> Pretty
-> KubernetesRequest DeleteStorageClass contentType res accept
applyOptionalParam KubernetesRequest DeleteStorageClass contentType res accept
req (Pretty Text
xs) =
KubernetesRequest DeleteStorageClass contentType res accept
req KubernetesRequest DeleteStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteStorageClass DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteStorageClass contentType res accept
-> DryRun
-> KubernetesRequest DeleteStorageClass contentType res accept
applyOptionalParam KubernetesRequest DeleteStorageClass contentType res accept
req (DryRun Text
xs) =
KubernetesRequest DeleteStorageClass contentType res accept
req KubernetesRequest DeleteStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteStorageClass GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteStorageClass contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest DeleteStorageClass contentType res accept
applyOptionalParam KubernetesRequest DeleteStorageClass contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest DeleteStorageClass contentType res accept
req KubernetesRequest DeleteStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteStorageClass IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteStorageClass contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest DeleteStorageClass contentType res accept
applyOptionalParam KubernetesRequest DeleteStorageClass contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest DeleteStorageClass contentType res accept
req KubernetesRequest DeleteStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteStorageClass OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteStorageClass contentType res accept
-> OrphanDependents
-> KubernetesRequest DeleteStorageClass contentType res accept
applyOptionalParam KubernetesRequest DeleteStorageClass contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest DeleteStorageClass contentType res accept
req KubernetesRequest DeleteStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteStorageClass PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteStorageClass contentType res accept
-> PropagationPolicy
-> KubernetesRequest DeleteStorageClass contentType res accept
applyOptionalParam KubernetesRequest DeleteStorageClass contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest DeleteStorageClass contentType res accept
req KubernetesRequest DeleteStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes DeleteStorageClass mtype
instance Produces DeleteStorageClass MimeJSON
instance Produces DeleteStorageClass MimeVndKubernetesProtobuf
instance Produces DeleteStorageClass MimeCbor
instance Produces DeleteStorageClass MimeYaml
deleteVolumeAttachment
:: (Consumes DeleteVolumeAttachment contentType)
=> ContentType contentType
-> Accept accept
-> Name
-> KubernetesRequest DeleteVolumeAttachment contentType V1VolumeAttachment accept
deleteVolumeAttachment :: forall contentType accept.
Consumes DeleteVolumeAttachment contentType =>
ContentType contentType
-> Accept accept
-> Name
-> KubernetesRequest
DeleteVolumeAttachment contentType V1VolumeAttachment accept
deleteVolumeAttachment ContentType contentType
_ Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
DeleteVolumeAttachment contentType V1VolumeAttachment accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"DELETE" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
DeleteVolumeAttachment contentType V1VolumeAttachment accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
DeleteVolumeAttachment contentType V1VolumeAttachment accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data DeleteVolumeAttachment
instance HasBodyParam DeleteVolumeAttachment V1DeleteOptions
instance HasOptionalParam DeleteVolumeAttachment Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteVolumeAttachment contentType res accept
-> Pretty
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest DeleteVolumeAttachment contentType res accept
req (Pretty Text
xs) =
KubernetesRequest DeleteVolumeAttachment contentType res accept
req KubernetesRequest DeleteVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteVolumeAttachment DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteVolumeAttachment contentType res accept
-> DryRun
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest DeleteVolumeAttachment contentType res accept
req (DryRun Text
xs) =
KubernetesRequest DeleteVolumeAttachment contentType res accept
req KubernetesRequest DeleteVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam DeleteVolumeAttachment GracePeriodSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteVolumeAttachment contentType res accept
-> GracePeriodSeconds
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest DeleteVolumeAttachment contentType res accept
req (GracePeriodSeconds Int
xs) =
KubernetesRequest DeleteVolumeAttachment contentType res accept
req KubernetesRequest DeleteVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"gracePeriodSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam DeleteVolumeAttachment IgnoreStoreReadErrorWithClusterBreakingPotential where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteVolumeAttachment contentType res accept
-> IgnoreStoreReadErrorWithClusterBreakingPotential
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest DeleteVolumeAttachment contentType res accept
req (IgnoreStoreReadErrorWithClusterBreakingPotential Bool
xs) =
KubernetesRequest DeleteVolumeAttachment contentType res accept
req KubernetesRequest DeleteVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"ignoreStoreReadErrorWithClusterBreakingPotential", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteVolumeAttachment OrphanDependents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteVolumeAttachment contentType res accept
-> OrphanDependents
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest DeleteVolumeAttachment contentType res accept
req (OrphanDependents Bool
xs) =
KubernetesRequest DeleteVolumeAttachment contentType res accept
req KubernetesRequest DeleteVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"orphanDependents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam DeleteVolumeAttachment PropagationPolicy where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest DeleteVolumeAttachment contentType res accept
-> PropagationPolicy
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest DeleteVolumeAttachment contentType res accept
req (PropagationPolicy Text
xs) =
KubernetesRequest DeleteVolumeAttachment contentType res accept
req KubernetesRequest DeleteVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest DeleteVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"propagationPolicy", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes DeleteVolumeAttachment mtype
instance Produces DeleteVolumeAttachment MimeJSON
instance Produces DeleteVolumeAttachment MimeVndKubernetesProtobuf
instance Produces DeleteVolumeAttachment MimeCbor
instance Produces DeleteVolumeAttachment MimeYaml
getAPIResources
:: Accept accept
-> KubernetesRequest GetAPIResources MimeNoContent V1APIResourceList accept
getAPIResources :: forall accept.
Accept accept
-> KubernetesRequest
GetAPIResources MimeNoContent V1APIResourceList accept
getAPIResources Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
GetAPIResources MimeNoContent V1APIResourceList accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/"]
KubernetesRequest
GetAPIResources MimeNoContent V1APIResourceList accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
GetAPIResources MimeNoContent V1APIResourceList accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data GetAPIResources
instance Produces GetAPIResources MimeJSON
instance Produces GetAPIResources MimeVndKubernetesProtobuf
instance Produces GetAPIResources MimeCbor
instance Produces GetAPIResources MimeYaml
listCSIDriver
:: Accept accept
-> KubernetesRequest ListCSIDriver MimeNoContent V1CSIDriverList accept
listCSIDriver :: forall accept.
Accept accept
-> KubernetesRequest
ListCSIDriver MimeNoContent V1CSIDriverList accept
listCSIDriver Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
ListCSIDriver MimeNoContent V1CSIDriverList accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/csidrivers"]
KubernetesRequest
ListCSIDriver MimeNoContent V1CSIDriverList accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ListCSIDriver MimeNoContent V1CSIDriverList accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ListCSIDriver
instance HasOptionalParam ListCSIDriver Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> Pretty -> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIDriver AllowWatchBookmarks where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> AllowWatchBookmarks
-> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (AllowWatchBookmarks Bool
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"allowWatchBookmarks", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListCSIDriver Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> Continue
-> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (Continue Text
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIDriver FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> FieldSelector
-> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIDriver LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> LabelSelector
-> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIDriver Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> Limit -> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (Limit Int
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListCSIDriver ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> ResourceVersion
-> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIDriver ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIDriver SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> SendInitialEvents
-> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListCSIDriver TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> TimeoutSeconds
-> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListCSIDriver Watch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSIDriver contentType res accept
-> Watch -> KubernetesRequest ListCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ListCSIDriver contentType res accept
req (Watch Bool
xs) =
KubernetesRequest ListCSIDriver contentType res accept
req KubernetesRequest ListCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"watch", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Produces ListCSIDriver MimeCborSeq
instance Produces ListCSIDriver MimeJSON
instance Produces ListCSIDriver MimeJsonstreamwatch
instance Produces ListCSIDriver MimeVndKubernetesProtobuf
instance Produces ListCSIDriver MimeVndKubernetesProtobufstreamwatch
instance Produces ListCSIDriver MimeCbor
instance Produces ListCSIDriver MimeYaml
listCSINode
:: Accept accept
-> KubernetesRequest ListCSINode MimeNoContent V1CSINodeList accept
listCSINode :: forall accept.
Accept accept
-> KubernetesRequest ListCSINode MimeNoContent V1CSINodeList accept
listCSINode Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest ListCSINode MimeNoContent V1CSINodeList accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/csinodes"]
KubernetesRequest ListCSINode MimeNoContent V1CSINodeList accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest ListCSINode MimeNoContent V1CSINodeList accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ListCSINode
instance HasOptionalParam ListCSINode Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> Pretty -> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSINode AllowWatchBookmarks where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> AllowWatchBookmarks
-> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (AllowWatchBookmarks Bool
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"allowWatchBookmarks", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListCSINode Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> Continue -> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (Continue Text
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSINode FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> FieldSelector
-> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSINode LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> LabelSelector
-> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSINode Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> Limit -> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (Limit Int
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListCSINode ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> ResourceVersion
-> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSINode ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSINode SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> SendInitialEvents
-> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListCSINode TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> TimeoutSeconds
-> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListCSINode Watch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListCSINode contentType res accept
-> Watch -> KubernetesRequest ListCSINode contentType res accept
applyOptionalParam KubernetesRequest ListCSINode contentType res accept
req (Watch Bool
xs) =
KubernetesRequest ListCSINode contentType res accept
req KubernetesRequest ListCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ListCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"watch", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Produces ListCSINode MimeCborSeq
instance Produces ListCSINode MimeJSON
instance Produces ListCSINode MimeJsonstreamwatch
instance Produces ListCSINode MimeVndKubernetesProtobuf
instance Produces ListCSINode MimeVndKubernetesProtobufstreamwatch
instance Produces ListCSINode MimeCbor
instance Produces ListCSINode MimeYaml
listCSIStorageCapacityForAllNamespaces
:: Accept accept
-> KubernetesRequest ListCSIStorageCapacityForAllNamespaces MimeNoContent V1CSIStorageCapacityList accept
listCSIStorageCapacityForAllNamespaces :: forall accept.
Accept accept
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces
MimeNoContent
V1CSIStorageCapacityList
accept
listCSIStorageCapacityForAllNamespaces Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces
MimeNoContent
V1CSIStorageCapacityList
accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/csistoragecapacities"]
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces
MimeNoContent
V1CSIStorageCapacityList
accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces
MimeNoContent
V1CSIStorageCapacityList
accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ListCSIStorageCapacityForAllNamespaces
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces AllowWatchBookmarks where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> AllowWatchBookmarks
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (AllowWatchBookmarks Bool
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"allowWatchBookmarks", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> Continue
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (Continue Text
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> FieldSelector
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> LabelSelector
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> Limit
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (Limit Int
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> Pretty
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> ResourceVersion
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> SendInitialEvents
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> TimeoutSeconds
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListCSIStorageCapacityForAllNamespaces Watch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> Watch
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
applyOptionalParam KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req (Watch Bool
xs) =
KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
req KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListCSIStorageCapacityForAllNamespaces contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"watch", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Produces ListCSIStorageCapacityForAllNamespaces MimeCborSeq
instance Produces ListCSIStorageCapacityForAllNamespaces MimeJSON
instance Produces ListCSIStorageCapacityForAllNamespaces MimeJsonstreamwatch
instance Produces ListCSIStorageCapacityForAllNamespaces MimeVndKubernetesProtobuf
instance Produces ListCSIStorageCapacityForAllNamespaces MimeVndKubernetesProtobufstreamwatch
instance Produces ListCSIStorageCapacityForAllNamespaces MimeCbor
instance Produces ListCSIStorageCapacityForAllNamespaces MimeYaml
listNamespacedCSIStorageCapacity
:: Accept accept
-> Namespace
-> KubernetesRequest ListNamespacedCSIStorageCapacity MimeNoContent V1CSIStorageCapacityList accept
listNamespacedCSIStorageCapacity :: forall accept.
Accept accept
-> Namespace
-> KubernetesRequest
ListNamespacedCSIStorageCapacity
MimeNoContent
V1CSIStorageCapacityList
accept
listNamespacedCSIStorageCapacity Accept accept
_ (Namespace Text
namespace) =
Method
-> [ByteString]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity
MimeNoContent
V1CSIStorageCapacityList
accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/namespaces/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
namespace,ByteString
"/csistoragecapacities"]
KubernetesRequest
ListNamespacedCSIStorageCapacity
MimeNoContent
V1CSIStorageCapacityList
accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ListNamespacedCSIStorageCapacity
MimeNoContent
V1CSIStorageCapacityList
accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ListNamespacedCSIStorageCapacity
instance HasOptionalParam ListNamespacedCSIStorageCapacity Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> Pretty
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity AllowWatchBookmarks where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> AllowWatchBookmarks
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (AllowWatchBookmarks Bool
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"allowWatchBookmarks", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> Continue
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (Continue Text
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> FieldSelector
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> LabelSelector
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> Limit
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (Limit Int
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> ResourceVersion
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> SendInitialEvents
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> TimeoutSeconds
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListNamespacedCSIStorageCapacity Watch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> Watch
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req (Watch Bool
xs) =
KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ListNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"watch", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Produces ListNamespacedCSIStorageCapacity MimeCborSeq
instance Produces ListNamespacedCSIStorageCapacity MimeJSON
instance Produces ListNamespacedCSIStorageCapacity MimeJsonstreamwatch
instance Produces ListNamespacedCSIStorageCapacity MimeVndKubernetesProtobuf
instance Produces ListNamespacedCSIStorageCapacity MimeVndKubernetesProtobufstreamwatch
instance Produces ListNamespacedCSIStorageCapacity MimeCbor
instance Produces ListNamespacedCSIStorageCapacity MimeYaml
listStorageClass
:: Accept accept
-> KubernetesRequest ListStorageClass MimeNoContent V1StorageClassList accept
listStorageClass :: forall accept.
Accept accept
-> KubernetesRequest
ListStorageClass MimeNoContent V1StorageClassList accept
listStorageClass Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
ListStorageClass MimeNoContent V1StorageClassList accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/storageclasses"]
KubernetesRequest
ListStorageClass MimeNoContent V1StorageClassList accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ListStorageClass MimeNoContent V1StorageClassList accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ListStorageClass
instance HasOptionalParam ListStorageClass Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> Pretty
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListStorageClass AllowWatchBookmarks where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> AllowWatchBookmarks
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (AllowWatchBookmarks Bool
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"allowWatchBookmarks", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListStorageClass Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> Continue
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (Continue Text
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListStorageClass FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> FieldSelector
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListStorageClass LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> LabelSelector
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListStorageClass Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> Limit
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (Limit Int
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListStorageClass ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> ResourceVersion
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListStorageClass ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListStorageClass SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> SendInitialEvents
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListStorageClass TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> TimeoutSeconds
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListStorageClass Watch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListStorageClass contentType res accept
-> Watch
-> KubernetesRequest ListStorageClass contentType res accept
applyOptionalParam KubernetesRequest ListStorageClass contentType res accept
req (Watch Bool
xs) =
KubernetesRequest ListStorageClass contentType res accept
req KubernetesRequest ListStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ListStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"watch", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Produces ListStorageClass MimeCborSeq
instance Produces ListStorageClass MimeJSON
instance Produces ListStorageClass MimeJsonstreamwatch
instance Produces ListStorageClass MimeVndKubernetesProtobuf
instance Produces ListStorageClass MimeVndKubernetesProtobufstreamwatch
instance Produces ListStorageClass MimeCbor
instance Produces ListStorageClass MimeYaml
listVolumeAttachment
:: Accept accept
-> KubernetesRequest ListVolumeAttachment MimeNoContent V1VolumeAttachmentList accept
listVolumeAttachment :: forall accept.
Accept accept
-> KubernetesRequest
ListVolumeAttachment MimeNoContent V1VolumeAttachmentList accept
listVolumeAttachment Accept accept
_ =
Method
-> [ByteString]
-> KubernetesRequest
ListVolumeAttachment MimeNoContent V1VolumeAttachmentList accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments"]
KubernetesRequest
ListVolumeAttachment MimeNoContent V1VolumeAttachmentList accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ListVolumeAttachment MimeNoContent V1VolumeAttachmentList accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ListVolumeAttachment
instance HasOptionalParam ListVolumeAttachment Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> Pretty
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListVolumeAttachment AllowWatchBookmarks where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> AllowWatchBookmarks
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (AllowWatchBookmarks Bool
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"allowWatchBookmarks", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListVolumeAttachment Continue where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> Continue
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (Continue Text
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"continue", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListVolumeAttachment FieldSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> FieldSelector
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (FieldSelector Text
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListVolumeAttachment LabelSelector where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> LabelSelector
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (LabelSelector Text
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"labelSelector", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListVolumeAttachment Limit where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> Limit
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (Limit Int
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"limit", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListVolumeAttachment ResourceVersion where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> ResourceVersion
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (ResourceVersion Text
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersion", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListVolumeAttachment ResourceVersionMatch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> ResourceVersionMatch
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (ResourceVersionMatch Text
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"resourceVersionMatch", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ListVolumeAttachment SendInitialEvents where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> SendInitialEvents
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (SendInitialEvents Bool
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"sendInitialEvents", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance HasOptionalParam ListVolumeAttachment TimeoutSeconds where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> TimeoutSeconds
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (TimeoutSeconds Int
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Int) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"timeoutSeconds", Int -> Maybe Int
forall a. a -> Maybe a
Just Int
xs)
instance HasOptionalParam ListVolumeAttachment Watch where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ListVolumeAttachment contentType res accept
-> Watch
-> KubernetesRequest ListVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ListVolumeAttachment contentType res accept
req (Watch Bool
xs) =
KubernetesRequest ListVolumeAttachment contentType res accept
req KubernetesRequest ListVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ListVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"watch", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Produces ListVolumeAttachment MimeCborSeq
instance Produces ListVolumeAttachment MimeJSON
instance Produces ListVolumeAttachment MimeJsonstreamwatch
instance Produces ListVolumeAttachment MimeVndKubernetesProtobuf
instance Produces ListVolumeAttachment MimeVndKubernetesProtobufstreamwatch
instance Produces ListVolumeAttachment MimeCbor
instance Produces ListVolumeAttachment MimeYaml
patchCSIDriver
:: (Consumes PatchCSIDriver contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest PatchCSIDriver contentType V1CSIDriver accept
patchCSIDriver :: forall contentType accept.
(Consumes PatchCSIDriver contentType,
MimeRender contentType Body) =>
ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest PatchCSIDriver contentType V1CSIDriver accept
patchCSIDriver ContentType contentType
_ Accept accept
_ Body
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest PatchCSIDriver contentType V1CSIDriver accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PATCH" [ByteString
"/apis/storage.k8s.io/v1/csidrivers/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest PatchCSIDriver contentType V1CSIDriver accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest PatchCSIDriver contentType V1CSIDriver accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest PatchCSIDriver contentType V1CSIDriver accept
-> Body
-> KubernetesRequest PatchCSIDriver contentType V1CSIDriver accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes PatchCSIDriver contentType,
MimeRender contentType Body) =>
KubernetesRequest PatchCSIDriver contentType res accept
-> Body -> KubernetesRequest PatchCSIDriver contentType res accept
`setBodyParam` Body
body
data PatchCSIDriver
instance HasBodyParam PatchCSIDriver Body
instance HasOptionalParam PatchCSIDriver Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSIDriver contentType res accept
-> Pretty
-> KubernetesRequest PatchCSIDriver contentType res accept
applyOptionalParam KubernetesRequest PatchCSIDriver contentType res accept
req (Pretty Text
xs) =
KubernetesRequest PatchCSIDriver contentType res accept
req KubernetesRequest PatchCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchCSIDriver DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSIDriver contentType res accept
-> DryRun
-> KubernetesRequest PatchCSIDriver contentType res accept
applyOptionalParam KubernetesRequest PatchCSIDriver contentType res accept
req (DryRun Text
xs) =
KubernetesRequest PatchCSIDriver contentType res accept
req KubernetesRequest PatchCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchCSIDriver FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSIDriver contentType res accept
-> FieldManager
-> KubernetesRequest PatchCSIDriver contentType res accept
applyOptionalParam KubernetesRequest PatchCSIDriver contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest PatchCSIDriver contentType res accept
req KubernetesRequest PatchCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchCSIDriver FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSIDriver contentType res accept
-> FieldValidation
-> KubernetesRequest PatchCSIDriver contentType res accept
applyOptionalParam KubernetesRequest PatchCSIDriver contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest PatchCSIDriver contentType res accept
req KubernetesRequest PatchCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchCSIDriver Force where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSIDriver contentType res accept
-> Force -> KubernetesRequest PatchCSIDriver contentType res accept
applyOptionalParam KubernetesRequest PatchCSIDriver contentType res accept
req (Force Bool
xs) =
KubernetesRequest PatchCSIDriver contentType res accept
req KubernetesRequest PatchCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"force", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Consumes PatchCSIDriver MimeApplyPatchyaml
instance Consumes PatchCSIDriver MimeJsonPatchjson
instance Consumes PatchCSIDriver MimeMergePatchjson
instance Consumes PatchCSIDriver MimeStrategicMergePatchjson
instance Consumes PatchCSIDriver MimeApplyPatchcbor
instance Produces PatchCSIDriver MimeJSON
instance Produces PatchCSIDriver MimeVndKubernetesProtobuf
instance Produces PatchCSIDriver MimeCbor
instance Produces PatchCSIDriver MimeYaml
patchCSINode
:: (Consumes PatchCSINode contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest PatchCSINode contentType V1CSINode accept
patchCSINode :: forall contentType accept.
(Consumes PatchCSINode contentType, MimeRender contentType Body) =>
ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest PatchCSINode contentType V1CSINode accept
patchCSINode ContentType contentType
_ Accept accept
_ Body
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest PatchCSINode contentType V1CSINode accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PATCH" [ByteString
"/apis/storage.k8s.io/v1/csinodes/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest PatchCSINode contentType V1CSINode accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest PatchCSINode contentType V1CSINode accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest PatchCSINode contentType V1CSINode accept
-> Body
-> KubernetesRequest PatchCSINode contentType V1CSINode accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes PatchCSINode contentType, MimeRender contentType Body) =>
KubernetesRequest PatchCSINode contentType res accept
-> Body -> KubernetesRequest PatchCSINode contentType res accept
`setBodyParam` Body
body
data PatchCSINode
instance HasBodyParam PatchCSINode Body
instance HasOptionalParam PatchCSINode Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSINode contentType res accept
-> Pretty -> KubernetesRequest PatchCSINode contentType res accept
applyOptionalParam KubernetesRequest PatchCSINode contentType res accept
req (Pretty Text
xs) =
KubernetesRequest PatchCSINode contentType res accept
req KubernetesRequest PatchCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchCSINode DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSINode contentType res accept
-> DryRun -> KubernetesRequest PatchCSINode contentType res accept
applyOptionalParam KubernetesRequest PatchCSINode contentType res accept
req (DryRun Text
xs) =
KubernetesRequest PatchCSINode contentType res accept
req KubernetesRequest PatchCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchCSINode FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSINode contentType res accept
-> FieldManager
-> KubernetesRequest PatchCSINode contentType res accept
applyOptionalParam KubernetesRequest PatchCSINode contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest PatchCSINode contentType res accept
req KubernetesRequest PatchCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchCSINode FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSINode contentType res accept
-> FieldValidation
-> KubernetesRequest PatchCSINode contentType res accept
applyOptionalParam KubernetesRequest PatchCSINode contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest PatchCSINode contentType res accept
req KubernetesRequest PatchCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchCSINode Force where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchCSINode contentType res accept
-> Force -> KubernetesRequest PatchCSINode contentType res accept
applyOptionalParam KubernetesRequest PatchCSINode contentType res accept
req (Force Bool
xs) =
KubernetesRequest PatchCSINode contentType res accept
req KubernetesRequest PatchCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"force", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Consumes PatchCSINode MimeApplyPatchyaml
instance Consumes PatchCSINode MimeJsonPatchjson
instance Consumes PatchCSINode MimeMergePatchjson
instance Consumes PatchCSINode MimeStrategicMergePatchjson
instance Consumes PatchCSINode MimeApplyPatchcbor
instance Produces PatchCSINode MimeJSON
instance Produces PatchCSINode MimeVndKubernetesProtobuf
instance Produces PatchCSINode MimeCbor
instance Produces PatchCSINode MimeYaml
patchNamespacedCSIStorageCapacity
:: (Consumes PatchNamespacedCSIStorageCapacity contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Name
-> Namespace
-> KubernetesRequest PatchNamespacedCSIStorageCapacity contentType V1CSIStorageCapacity accept
patchNamespacedCSIStorageCapacity :: forall contentType accept.
(Consumes PatchNamespacedCSIStorageCapacity contentType,
MimeRender contentType Body) =>
ContentType contentType
-> Accept accept
-> Body
-> Name
-> Namespace
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
patchNamespacedCSIStorageCapacity ContentType contentType
_ Accept accept
_ Body
body (Name Text
name) (Namespace Text
namespace) =
Method
-> [ByteString]
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PATCH" [ByteString
"/apis/storage.k8s.io/v1/namespaces/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
namespace,ByteString
"/csistoragecapacities/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
PatchNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
PatchNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
-> Body
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes PatchNamespacedCSIStorageCapacity contentType,
MimeRender contentType Body) =>
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> Body
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
`setBodyParam` Body
body
data PatchNamespacedCSIStorageCapacity
instance HasBodyParam PatchNamespacedCSIStorageCapacity Body
instance HasOptionalParam PatchNamespacedCSIStorageCapacity Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> Pretty
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchNamespacedCSIStorageCapacity DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> DryRun
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchNamespacedCSIStorageCapacity FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> FieldManager
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchNamespacedCSIStorageCapacity FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> FieldValidation
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchNamespacedCSIStorageCapacity Force where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> Force
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req (Force Bool
xs) =
KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"force", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Consumes PatchNamespacedCSIStorageCapacity MimeApplyPatchyaml
instance Consumes PatchNamespacedCSIStorageCapacity MimeJsonPatchjson
instance Consumes PatchNamespacedCSIStorageCapacity MimeMergePatchjson
instance Consumes PatchNamespacedCSIStorageCapacity MimeStrategicMergePatchjson
instance Consumes PatchNamespacedCSIStorageCapacity MimeApplyPatchcbor
instance Produces PatchNamespacedCSIStorageCapacity MimeJSON
instance Produces PatchNamespacedCSIStorageCapacity MimeVndKubernetesProtobuf
instance Produces PatchNamespacedCSIStorageCapacity MimeCbor
instance Produces PatchNamespacedCSIStorageCapacity MimeYaml
patchStorageClass
:: (Consumes PatchStorageClass contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest PatchStorageClass contentType V1StorageClass accept
patchStorageClass :: forall contentType accept.
(Consumes PatchStorageClass contentType,
MimeRender contentType Body) =>
ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest
PatchStorageClass contentType V1StorageClass accept
patchStorageClass ContentType contentType
_ Accept accept
_ Body
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
PatchStorageClass contentType V1StorageClass accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PATCH" [ByteString
"/apis/storage.k8s.io/v1/storageclasses/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
PatchStorageClass contentType V1StorageClass accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
PatchStorageClass contentType V1StorageClass accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
PatchStorageClass contentType V1StorageClass accept
-> Body
-> KubernetesRequest
PatchStorageClass contentType V1StorageClass accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes PatchStorageClass contentType,
MimeRender contentType Body) =>
KubernetesRequest PatchStorageClass contentType res accept
-> Body
-> KubernetesRequest PatchStorageClass contentType res accept
`setBodyParam` Body
body
data PatchStorageClass
instance HasBodyParam PatchStorageClass Body
instance HasOptionalParam PatchStorageClass Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchStorageClass contentType res accept
-> Pretty
-> KubernetesRequest PatchStorageClass contentType res accept
applyOptionalParam KubernetesRequest PatchStorageClass contentType res accept
req (Pretty Text
xs) =
KubernetesRequest PatchStorageClass contentType res accept
req KubernetesRequest PatchStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchStorageClass DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchStorageClass contentType res accept
-> DryRun
-> KubernetesRequest PatchStorageClass contentType res accept
applyOptionalParam KubernetesRequest PatchStorageClass contentType res accept
req (DryRun Text
xs) =
KubernetesRequest PatchStorageClass contentType res accept
req KubernetesRequest PatchStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchStorageClass FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchStorageClass contentType res accept
-> FieldManager
-> KubernetesRequest PatchStorageClass contentType res accept
applyOptionalParam KubernetesRequest PatchStorageClass contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest PatchStorageClass contentType res accept
req KubernetesRequest PatchStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchStorageClass FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchStorageClass contentType res accept
-> FieldValidation
-> KubernetesRequest PatchStorageClass contentType res accept
applyOptionalParam KubernetesRequest PatchStorageClass contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest PatchStorageClass contentType res accept
req KubernetesRequest PatchStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchStorageClass Force where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchStorageClass contentType res accept
-> Force
-> KubernetesRequest PatchStorageClass contentType res accept
applyOptionalParam KubernetesRequest PatchStorageClass contentType res accept
req (Force Bool
xs) =
KubernetesRequest PatchStorageClass contentType res accept
req KubernetesRequest PatchStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"force", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Consumes PatchStorageClass MimeApplyPatchyaml
instance Consumes PatchStorageClass MimeJsonPatchjson
instance Consumes PatchStorageClass MimeMergePatchjson
instance Consumes PatchStorageClass MimeStrategicMergePatchjson
instance Consumes PatchStorageClass MimeApplyPatchcbor
instance Produces PatchStorageClass MimeJSON
instance Produces PatchStorageClass MimeVndKubernetesProtobuf
instance Produces PatchStorageClass MimeCbor
instance Produces PatchStorageClass MimeYaml
patchVolumeAttachment
:: (Consumes PatchVolumeAttachment contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest PatchVolumeAttachment contentType V1VolumeAttachment accept
patchVolumeAttachment :: forall contentType accept.
(Consumes PatchVolumeAttachment contentType,
MimeRender contentType Body) =>
ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest
PatchVolumeAttachment contentType V1VolumeAttachment accept
patchVolumeAttachment ContentType contentType
_ Accept accept
_ Body
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
PatchVolumeAttachment contentType V1VolumeAttachment accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PATCH" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
PatchVolumeAttachment contentType V1VolumeAttachment accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
PatchVolumeAttachment contentType V1VolumeAttachment accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
PatchVolumeAttachment contentType V1VolumeAttachment accept
-> Body
-> KubernetesRequest
PatchVolumeAttachment contentType V1VolumeAttachment accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes PatchVolumeAttachment contentType,
MimeRender contentType Body) =>
KubernetesRequest PatchVolumeAttachment contentType res accept
-> Body
-> KubernetesRequest PatchVolumeAttachment contentType res accept
`setBodyParam` Body
body
data PatchVolumeAttachment
instance HasBodyParam PatchVolumeAttachment Body
instance HasOptionalParam PatchVolumeAttachment Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchVolumeAttachment contentType res accept
-> Pretty
-> KubernetesRequest PatchVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest PatchVolumeAttachment contentType res accept
req (Pretty Text
xs) =
KubernetesRequest PatchVolumeAttachment contentType res accept
req KubernetesRequest PatchVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchVolumeAttachment DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchVolumeAttachment contentType res accept
-> DryRun
-> KubernetesRequest PatchVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest PatchVolumeAttachment contentType res accept
req (DryRun Text
xs) =
KubernetesRequest PatchVolumeAttachment contentType res accept
req KubernetesRequest PatchVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchVolumeAttachment FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchVolumeAttachment contentType res accept
-> FieldManager
-> KubernetesRequest PatchVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest PatchVolumeAttachment contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest PatchVolumeAttachment contentType res accept
req KubernetesRequest PatchVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchVolumeAttachment FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchVolumeAttachment contentType res accept
-> FieldValidation
-> KubernetesRequest PatchVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest PatchVolumeAttachment contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest PatchVolumeAttachment contentType res accept
req KubernetesRequest PatchVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchVolumeAttachment Force where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest PatchVolumeAttachment contentType res accept
-> Force
-> KubernetesRequest PatchVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest PatchVolumeAttachment contentType res accept
req (Force Bool
xs) =
KubernetesRequest PatchVolumeAttachment contentType res accept
req KubernetesRequest PatchVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest PatchVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"force", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Consumes PatchVolumeAttachment MimeApplyPatchyaml
instance Consumes PatchVolumeAttachment MimeJsonPatchjson
instance Consumes PatchVolumeAttachment MimeMergePatchjson
instance Consumes PatchVolumeAttachment MimeStrategicMergePatchjson
instance Consumes PatchVolumeAttachment MimeApplyPatchcbor
instance Produces PatchVolumeAttachment MimeJSON
instance Produces PatchVolumeAttachment MimeVndKubernetesProtobuf
instance Produces PatchVolumeAttachment MimeCbor
instance Produces PatchVolumeAttachment MimeYaml
patchVolumeAttachmentStatus
:: (Consumes PatchVolumeAttachmentStatus contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest PatchVolumeAttachmentStatus contentType V1VolumeAttachment accept
patchVolumeAttachmentStatus :: forall contentType accept.
(Consumes PatchVolumeAttachmentStatus contentType,
MimeRender contentType Body) =>
ContentType contentType
-> Accept accept
-> Body
-> Name
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType V1VolumeAttachment accept
patchVolumeAttachmentStatus ContentType contentType
_ Accept accept
_ Body
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType V1VolumeAttachment accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PATCH" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name,ByteString
"/status"]
KubernetesRequest
PatchVolumeAttachmentStatus contentType V1VolumeAttachment accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType V1VolumeAttachment accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
PatchVolumeAttachmentStatus contentType V1VolumeAttachment accept
-> Body
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType V1VolumeAttachment accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes PatchVolumeAttachmentStatus contentType,
MimeRender contentType Body) =>
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> Body
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
`setBodyParam` Body
body
data PatchVolumeAttachmentStatus
instance HasBodyParam PatchVolumeAttachmentStatus Body
instance HasOptionalParam PatchVolumeAttachmentStatus Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> Pretty
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchVolumeAttachmentStatus DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> DryRun
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchVolumeAttachmentStatus FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> FieldManager
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchVolumeAttachmentStatus FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> FieldValidation
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam PatchVolumeAttachmentStatus Force where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> Force
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req (Force Bool
xs) =
KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
req KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
PatchVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Bool) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"force", Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
xs)
instance Consumes PatchVolumeAttachmentStatus MimeApplyPatchyaml
instance Consumes PatchVolumeAttachmentStatus MimeJsonPatchjson
instance Consumes PatchVolumeAttachmentStatus MimeMergePatchjson
instance Consumes PatchVolumeAttachmentStatus MimeStrategicMergePatchjson
instance Consumes PatchVolumeAttachmentStatus MimeApplyPatchcbor
instance Produces PatchVolumeAttachmentStatus MimeJSON
instance Produces PatchVolumeAttachmentStatus MimeVndKubernetesProtobuf
instance Produces PatchVolumeAttachmentStatus MimeCbor
instance Produces PatchVolumeAttachmentStatus MimeYaml
readCSIDriver
:: Accept accept
-> Name
-> KubernetesRequest ReadCSIDriver MimeNoContent V1CSIDriver accept
readCSIDriver :: forall accept.
Accept accept
-> Name
-> KubernetesRequest ReadCSIDriver MimeNoContent V1CSIDriver accept
readCSIDriver Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest ReadCSIDriver MimeNoContent V1CSIDriver accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/csidrivers/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest ReadCSIDriver MimeNoContent V1CSIDriver accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest ReadCSIDriver MimeNoContent V1CSIDriver accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ReadCSIDriver
instance HasOptionalParam ReadCSIDriver Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReadCSIDriver contentType res accept
-> Pretty -> KubernetesRequest ReadCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ReadCSIDriver contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReadCSIDriver contentType res accept
req KubernetesRequest ReadCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ReadCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance Produces ReadCSIDriver MimeJSON
instance Produces ReadCSIDriver MimeVndKubernetesProtobuf
instance Produces ReadCSIDriver MimeCbor
instance Produces ReadCSIDriver MimeYaml
readCSINode
:: Accept accept
-> Name
-> KubernetesRequest ReadCSINode MimeNoContent V1CSINode accept
readCSINode :: forall accept.
Accept accept
-> Name
-> KubernetesRequest ReadCSINode MimeNoContent V1CSINode accept
readCSINode Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest ReadCSINode MimeNoContent V1CSINode accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/csinodes/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest ReadCSINode MimeNoContent V1CSINode accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest ReadCSINode MimeNoContent V1CSINode accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ReadCSINode
instance HasOptionalParam ReadCSINode Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReadCSINode contentType res accept
-> Pretty -> KubernetesRequest ReadCSINode contentType res accept
applyOptionalParam KubernetesRequest ReadCSINode contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReadCSINode contentType res accept
req KubernetesRequest ReadCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ReadCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance Produces ReadCSINode MimeJSON
instance Produces ReadCSINode MimeVndKubernetesProtobuf
instance Produces ReadCSINode MimeCbor
instance Produces ReadCSINode MimeYaml
readNamespacedCSIStorageCapacity
:: Accept accept
-> Name
-> Namespace
-> KubernetesRequest ReadNamespacedCSIStorageCapacity MimeNoContent V1CSIStorageCapacity accept
readNamespacedCSIStorageCapacity :: forall accept.
Accept accept
-> Name
-> Namespace
-> KubernetesRequest
ReadNamespacedCSIStorageCapacity
MimeNoContent
V1CSIStorageCapacity
accept
readNamespacedCSIStorageCapacity Accept accept
_ (Name Text
name) (Namespace Text
namespace) =
Method
-> [ByteString]
-> KubernetesRequest
ReadNamespacedCSIStorageCapacity
MimeNoContent
V1CSIStorageCapacity
accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/namespaces/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
namespace,ByteString
"/csistoragecapacities/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
ReadNamespacedCSIStorageCapacity
MimeNoContent
V1CSIStorageCapacity
accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReadNamespacedCSIStorageCapacity
MimeNoContent
V1CSIStorageCapacity
accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ReadNamespacedCSIStorageCapacity
instance HasOptionalParam ReadNamespacedCSIStorageCapacity Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReadNamespacedCSIStorageCapacity contentType res accept
-> Pretty
-> KubernetesRequest
ReadNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ReadNamespacedCSIStorageCapacity contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
ReadNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ReadNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReadNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance Produces ReadNamespacedCSIStorageCapacity MimeJSON
instance Produces ReadNamespacedCSIStorageCapacity MimeVndKubernetesProtobuf
instance Produces ReadNamespacedCSIStorageCapacity MimeCbor
instance Produces ReadNamespacedCSIStorageCapacity MimeYaml
readStorageClass
:: Accept accept
-> Name
-> KubernetesRequest ReadStorageClass MimeNoContent V1StorageClass accept
readStorageClass :: forall accept.
Accept accept
-> Name
-> KubernetesRequest
ReadStorageClass MimeNoContent V1StorageClass accept
readStorageClass Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
ReadStorageClass MimeNoContent V1StorageClass accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/storageclasses/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
ReadStorageClass MimeNoContent V1StorageClass accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReadStorageClass MimeNoContent V1StorageClass accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ReadStorageClass
instance HasOptionalParam ReadStorageClass Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReadStorageClass contentType res accept
-> Pretty
-> KubernetesRequest ReadStorageClass contentType res accept
applyOptionalParam KubernetesRequest ReadStorageClass contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReadStorageClass contentType res accept
req KubernetesRequest ReadStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ReadStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance Produces ReadStorageClass MimeJSON
instance Produces ReadStorageClass MimeVndKubernetesProtobuf
instance Produces ReadStorageClass MimeCbor
instance Produces ReadStorageClass MimeYaml
readVolumeAttachment
:: Accept accept
-> Name
-> KubernetesRequest ReadVolumeAttachment MimeNoContent V1VolumeAttachment accept
readVolumeAttachment :: forall accept.
Accept accept
-> Name
-> KubernetesRequest
ReadVolumeAttachment MimeNoContent V1VolumeAttachment accept
readVolumeAttachment Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
ReadVolumeAttachment MimeNoContent V1VolumeAttachment accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
ReadVolumeAttachment MimeNoContent V1VolumeAttachment accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReadVolumeAttachment MimeNoContent V1VolumeAttachment accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ReadVolumeAttachment
instance HasOptionalParam ReadVolumeAttachment Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReadVolumeAttachment contentType res accept
-> Pretty
-> KubernetesRequest ReadVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ReadVolumeAttachment contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReadVolumeAttachment contentType res accept
req KubernetesRequest ReadVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ReadVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance Produces ReadVolumeAttachment MimeJSON
instance Produces ReadVolumeAttachment MimeVndKubernetesProtobuf
instance Produces ReadVolumeAttachment MimeCbor
instance Produces ReadVolumeAttachment MimeYaml
readVolumeAttachmentStatus
:: Accept accept
-> Name
-> KubernetesRequest ReadVolumeAttachmentStatus MimeNoContent V1VolumeAttachment accept
readVolumeAttachmentStatus :: forall accept.
Accept accept
-> Name
-> KubernetesRequest
ReadVolumeAttachmentStatus MimeNoContent V1VolumeAttachment accept
readVolumeAttachmentStatus Accept accept
_ (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
ReadVolumeAttachmentStatus MimeNoContent V1VolumeAttachment accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"GET" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name,ByteString
"/status"]
KubernetesRequest
ReadVolumeAttachmentStatus MimeNoContent V1VolumeAttachment accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReadVolumeAttachmentStatus MimeNoContent V1VolumeAttachment accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ReadVolumeAttachmentStatus
instance HasOptionalParam ReadVolumeAttachmentStatus Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReadVolumeAttachmentStatus contentType res accept
-> Pretty
-> KubernetesRequest
ReadVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest ReadVolumeAttachmentStatus contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReadVolumeAttachmentStatus contentType res accept
req KubernetesRequest ReadVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReadVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance Produces ReadVolumeAttachmentStatus MimeJSON
instance Produces ReadVolumeAttachmentStatus MimeVndKubernetesProtobuf
instance Produces ReadVolumeAttachmentStatus MimeCbor
instance Produces ReadVolumeAttachmentStatus MimeYaml
replaceCSIDriver
:: (Consumes ReplaceCSIDriver contentType, MimeRender contentType V1CSIDriver)
=> ContentType contentType
-> Accept accept
-> V1CSIDriver
-> Name
-> KubernetesRequest ReplaceCSIDriver contentType V1CSIDriver accept
replaceCSIDriver :: forall contentType accept.
(Consumes ReplaceCSIDriver contentType,
MimeRender contentType V1CSIDriver) =>
ContentType contentType
-> Accept accept
-> V1CSIDriver
-> Name
-> KubernetesRequest
ReplaceCSIDriver contentType V1CSIDriver accept
replaceCSIDriver ContentType contentType
_ Accept accept
_ V1CSIDriver
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
ReplaceCSIDriver contentType V1CSIDriver accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PUT" [ByteString
"/apis/storage.k8s.io/v1/csidrivers/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest ReplaceCSIDriver contentType V1CSIDriver accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReplaceCSIDriver contentType V1CSIDriver accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest ReplaceCSIDriver contentType V1CSIDriver accept
-> V1CSIDriver
-> KubernetesRequest
ReplaceCSIDriver contentType V1CSIDriver accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes ReplaceCSIDriver contentType,
MimeRender contentType V1CSIDriver) =>
KubernetesRequest ReplaceCSIDriver contentType res accept
-> V1CSIDriver
-> KubernetesRequest ReplaceCSIDriver contentType res accept
`setBodyParam` V1CSIDriver
body
data ReplaceCSIDriver
instance HasBodyParam ReplaceCSIDriver V1CSIDriver
instance HasOptionalParam ReplaceCSIDriver Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceCSIDriver contentType res accept
-> Pretty
-> KubernetesRequest ReplaceCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ReplaceCSIDriver contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReplaceCSIDriver contentType res accept
req KubernetesRequest ReplaceCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceCSIDriver DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceCSIDriver contentType res accept
-> DryRun
-> KubernetesRequest ReplaceCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ReplaceCSIDriver contentType res accept
req (DryRun Text
xs) =
KubernetesRequest ReplaceCSIDriver contentType res accept
req KubernetesRequest ReplaceCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceCSIDriver FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceCSIDriver contentType res accept
-> FieldManager
-> KubernetesRequest ReplaceCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ReplaceCSIDriver contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest ReplaceCSIDriver contentType res accept
req KubernetesRequest ReplaceCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceCSIDriver FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceCSIDriver contentType res accept
-> FieldValidation
-> KubernetesRequest ReplaceCSIDriver contentType res accept
applyOptionalParam KubernetesRequest ReplaceCSIDriver contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest ReplaceCSIDriver contentType res accept
req KubernetesRequest ReplaceCSIDriver contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceCSIDriver contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes ReplaceCSIDriver mtype
instance Produces ReplaceCSIDriver MimeJSON
instance Produces ReplaceCSIDriver MimeVndKubernetesProtobuf
instance Produces ReplaceCSIDriver MimeCbor
instance Produces ReplaceCSIDriver MimeYaml
replaceCSINode
:: (Consumes ReplaceCSINode contentType, MimeRender contentType V1CSINode)
=> ContentType contentType
-> Accept accept
-> V1CSINode
-> Name
-> KubernetesRequest ReplaceCSINode contentType V1CSINode accept
replaceCSINode :: forall contentType accept.
(Consumes ReplaceCSINode contentType,
MimeRender contentType V1CSINode) =>
ContentType contentType
-> Accept accept
-> V1CSINode
-> Name
-> KubernetesRequest ReplaceCSINode contentType V1CSINode accept
replaceCSINode ContentType contentType
_ Accept accept
_ V1CSINode
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest ReplaceCSINode contentType V1CSINode accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PUT" [ByteString
"/apis/storage.k8s.io/v1/csinodes/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest ReplaceCSINode contentType V1CSINode accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest ReplaceCSINode contentType V1CSINode accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest ReplaceCSINode contentType V1CSINode accept
-> V1CSINode
-> KubernetesRequest ReplaceCSINode contentType V1CSINode accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes ReplaceCSINode contentType,
MimeRender contentType V1CSINode) =>
KubernetesRequest ReplaceCSINode contentType res accept
-> V1CSINode
-> KubernetesRequest ReplaceCSINode contentType res accept
`setBodyParam` V1CSINode
body
data ReplaceCSINode
instance HasBodyParam ReplaceCSINode V1CSINode
instance HasOptionalParam ReplaceCSINode Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceCSINode contentType res accept
-> Pretty
-> KubernetesRequest ReplaceCSINode contentType res accept
applyOptionalParam KubernetesRequest ReplaceCSINode contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReplaceCSINode contentType res accept
req KubernetesRequest ReplaceCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceCSINode DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceCSINode contentType res accept
-> DryRun
-> KubernetesRequest ReplaceCSINode contentType res accept
applyOptionalParam KubernetesRequest ReplaceCSINode contentType res accept
req (DryRun Text
xs) =
KubernetesRequest ReplaceCSINode contentType res accept
req KubernetesRequest ReplaceCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceCSINode FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceCSINode contentType res accept
-> FieldManager
-> KubernetesRequest ReplaceCSINode contentType res accept
applyOptionalParam KubernetesRequest ReplaceCSINode contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest ReplaceCSINode contentType res accept
req KubernetesRequest ReplaceCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceCSINode FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceCSINode contentType res accept
-> FieldValidation
-> KubernetesRequest ReplaceCSINode contentType res accept
applyOptionalParam KubernetesRequest ReplaceCSINode contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest ReplaceCSINode contentType res accept
req KubernetesRequest ReplaceCSINode contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceCSINode contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes ReplaceCSINode mtype
instance Produces ReplaceCSINode MimeJSON
instance Produces ReplaceCSINode MimeVndKubernetesProtobuf
instance Produces ReplaceCSINode MimeCbor
instance Produces ReplaceCSINode MimeYaml
replaceNamespacedCSIStorageCapacity
:: (Consumes ReplaceNamespacedCSIStorageCapacity contentType, MimeRender contentType V1CSIStorageCapacity)
=> ContentType contentType
-> Accept accept
-> V1CSIStorageCapacity
-> Name
-> Namespace
-> KubernetesRequest ReplaceNamespacedCSIStorageCapacity contentType V1CSIStorageCapacity accept
replaceNamespacedCSIStorageCapacity :: forall contentType accept.
(Consumes ReplaceNamespacedCSIStorageCapacity contentType,
MimeRender contentType V1CSIStorageCapacity) =>
ContentType contentType
-> Accept accept
-> V1CSIStorageCapacity
-> Name
-> Namespace
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
replaceNamespacedCSIStorageCapacity ContentType contentType
_ Accept accept
_ V1CSIStorageCapacity
body (Name Text
name) (Namespace Text
namespace) =
Method
-> [ByteString]
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PUT" [ByteString
"/apis/storage.k8s.io/v1/namespaces/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
namespace,ByteString
"/csistoragecapacities/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
-> V1CSIStorageCapacity
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity
contentType
V1CSIStorageCapacity
accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes ReplaceNamespacedCSIStorageCapacity contentType,
MimeRender contentType V1CSIStorageCapacity) =>
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> V1CSIStorageCapacity
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
`setBodyParam` V1CSIStorageCapacity
body
data ReplaceNamespacedCSIStorageCapacity
instance HasBodyParam ReplaceNamespacedCSIStorageCapacity V1CSIStorageCapacity
instance HasOptionalParam ReplaceNamespacedCSIStorageCapacity Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> Pretty
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceNamespacedCSIStorageCapacity DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> DryRun
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceNamespacedCSIStorageCapacity FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> FieldManager
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceNamespacedCSIStorageCapacity FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> FieldValidation
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
applyOptionalParam KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
req KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReplaceNamespacedCSIStorageCapacity contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes ReplaceNamespacedCSIStorageCapacity mtype
instance Produces ReplaceNamespacedCSIStorageCapacity MimeJSON
instance Produces ReplaceNamespacedCSIStorageCapacity MimeVndKubernetesProtobuf
instance Produces ReplaceNamespacedCSIStorageCapacity MimeCbor
instance Produces ReplaceNamespacedCSIStorageCapacity MimeYaml
replaceStorageClass
:: (Consumes ReplaceStorageClass contentType, MimeRender contentType V1StorageClass)
=> ContentType contentType
-> Accept accept
-> V1StorageClass
-> Name
-> KubernetesRequest ReplaceStorageClass contentType V1StorageClass accept
replaceStorageClass :: forall contentType accept.
(Consumes ReplaceStorageClass contentType,
MimeRender contentType V1StorageClass) =>
ContentType contentType
-> Accept accept
-> V1StorageClass
-> Name
-> KubernetesRequest
ReplaceStorageClass contentType V1StorageClass accept
replaceStorageClass ContentType contentType
_ Accept accept
_ V1StorageClass
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
ReplaceStorageClass contentType V1StorageClass accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PUT" [ByteString
"/apis/storage.k8s.io/v1/storageclasses/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
ReplaceStorageClass contentType V1StorageClass accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReplaceStorageClass contentType V1StorageClass accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
ReplaceStorageClass contentType V1StorageClass accept
-> V1StorageClass
-> KubernetesRequest
ReplaceStorageClass contentType V1StorageClass accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes ReplaceStorageClass contentType,
MimeRender contentType V1StorageClass) =>
KubernetesRequest ReplaceStorageClass contentType res accept
-> V1StorageClass
-> KubernetesRequest ReplaceStorageClass contentType res accept
`setBodyParam` V1StorageClass
body
data ReplaceStorageClass
instance HasBodyParam ReplaceStorageClass V1StorageClass
instance HasOptionalParam ReplaceStorageClass Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceStorageClass contentType res accept
-> Pretty
-> KubernetesRequest ReplaceStorageClass contentType res accept
applyOptionalParam KubernetesRequest ReplaceStorageClass contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReplaceStorageClass contentType res accept
req KubernetesRequest ReplaceStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceStorageClass DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceStorageClass contentType res accept
-> DryRun
-> KubernetesRequest ReplaceStorageClass contentType res accept
applyOptionalParam KubernetesRequest ReplaceStorageClass contentType res accept
req (DryRun Text
xs) =
KubernetesRequest ReplaceStorageClass contentType res accept
req KubernetesRequest ReplaceStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceStorageClass FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceStorageClass contentType res accept
-> FieldManager
-> KubernetesRequest ReplaceStorageClass contentType res accept
applyOptionalParam KubernetesRequest ReplaceStorageClass contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest ReplaceStorageClass contentType res accept
req KubernetesRequest ReplaceStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceStorageClass FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceStorageClass contentType res accept
-> FieldValidation
-> KubernetesRequest ReplaceStorageClass contentType res accept
applyOptionalParam KubernetesRequest ReplaceStorageClass contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest ReplaceStorageClass contentType res accept
req KubernetesRequest ReplaceStorageClass contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceStorageClass contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes ReplaceStorageClass mtype
instance Produces ReplaceStorageClass MimeJSON
instance Produces ReplaceStorageClass MimeVndKubernetesProtobuf
instance Produces ReplaceStorageClass MimeCbor
instance Produces ReplaceStorageClass MimeYaml
replaceVolumeAttachment
:: (Consumes ReplaceVolumeAttachment contentType, MimeRender contentType V1VolumeAttachment)
=> ContentType contentType
-> Accept accept
-> V1VolumeAttachment
-> Name
-> KubernetesRequest ReplaceVolumeAttachment contentType V1VolumeAttachment accept
replaceVolumeAttachment :: forall contentType accept.
(Consumes ReplaceVolumeAttachment contentType,
MimeRender contentType V1VolumeAttachment) =>
ContentType contentType
-> Accept accept
-> V1VolumeAttachment
-> Name
-> KubernetesRequest
ReplaceVolumeAttachment contentType V1VolumeAttachment accept
replaceVolumeAttachment ContentType contentType
_ Accept accept
_ V1VolumeAttachment
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
ReplaceVolumeAttachment contentType V1VolumeAttachment accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PUT" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name]
KubernetesRequest
ReplaceVolumeAttachment contentType V1VolumeAttachment accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReplaceVolumeAttachment contentType V1VolumeAttachment accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
ReplaceVolumeAttachment contentType V1VolumeAttachment accept
-> V1VolumeAttachment
-> KubernetesRequest
ReplaceVolumeAttachment contentType V1VolumeAttachment accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes ReplaceVolumeAttachment contentType,
MimeRender contentType V1VolumeAttachment) =>
KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> V1VolumeAttachment
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
`setBodyParam` V1VolumeAttachment
body
data ReplaceVolumeAttachment
instance HasBodyParam ReplaceVolumeAttachment V1VolumeAttachment
instance HasOptionalParam ReplaceVolumeAttachment Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> Pretty
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ReplaceVolumeAttachment contentType res accept
req (Pretty Text
xs) =
KubernetesRequest ReplaceVolumeAttachment contentType res accept
req KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceVolumeAttachment DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> DryRun
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ReplaceVolumeAttachment contentType res accept
req (DryRun Text
xs) =
KubernetesRequest ReplaceVolumeAttachment contentType res accept
req KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceVolumeAttachment FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> FieldManager
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ReplaceVolumeAttachment contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest ReplaceVolumeAttachment contentType res accept
req KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceVolumeAttachment FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> FieldValidation
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
applyOptionalParam KubernetesRequest ReplaceVolumeAttachment contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest ReplaceVolumeAttachment contentType res accept
req KubernetesRequest ReplaceVolumeAttachment contentType res accept
-> [QueryItem]
-> KubernetesRequest ReplaceVolumeAttachment contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes ReplaceVolumeAttachment mtype
instance Produces ReplaceVolumeAttachment MimeJSON
instance Produces ReplaceVolumeAttachment MimeVndKubernetesProtobuf
instance Produces ReplaceVolumeAttachment MimeCbor
instance Produces ReplaceVolumeAttachment MimeYaml
replaceVolumeAttachmentStatus
:: (Consumes ReplaceVolumeAttachmentStatus contentType, MimeRender contentType V1VolumeAttachment)
=> ContentType contentType
-> Accept accept
-> V1VolumeAttachment
-> Name
-> KubernetesRequest ReplaceVolumeAttachmentStatus contentType V1VolumeAttachment accept
replaceVolumeAttachmentStatus :: forall contentType accept.
(Consumes ReplaceVolumeAttachmentStatus contentType,
MimeRender contentType V1VolumeAttachment) =>
ContentType contentType
-> Accept accept
-> V1VolumeAttachment
-> Name
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType V1VolumeAttachment accept
replaceVolumeAttachmentStatus ContentType contentType
_ Accept accept
_ V1VolumeAttachment
body (Name Text
name) =
Method
-> [ByteString]
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType V1VolumeAttachment accept
forall req contentType res accept.
Method
-> [ByteString] -> KubernetesRequest req contentType res accept
_mkRequest Method
"PUT" [ByteString
"/apis/storage.k8s.io/v1/volumeattachments/",Text -> ByteString
forall a. ToHttpApiData a => a -> ByteString
toPath Text
name,ByteString
"/status"]
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType V1VolumeAttachment accept
-> Proxy AuthApiKeyBearerToken
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType V1VolumeAttachment accept
forall authMethod req contentType res accept.
AuthMethod authMethod =>
KubernetesRequest req contentType res accept
-> Proxy authMethod -> KubernetesRequest req contentType res accept
`_hasAuthType` (Proxy AuthApiKeyBearerToken
forall {k} (t :: k). Proxy t
P.Proxy :: P.Proxy AuthApiKeyBearerToken)
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType V1VolumeAttachment accept
-> V1VolumeAttachment
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType V1VolumeAttachment accept
forall req param contentType res accept.
(HasBodyParam req param, Consumes req contentType,
MimeRender contentType param) =>
KubernetesRequest req contentType res accept
-> param -> KubernetesRequest req contentType res accept
forall contentType res accept.
(Consumes ReplaceVolumeAttachmentStatus contentType,
MimeRender contentType V1VolumeAttachment) =>
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> V1VolumeAttachment
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
`setBodyParam` V1VolumeAttachment
body
data ReplaceVolumeAttachmentStatus
instance HasBodyParam ReplaceVolumeAttachmentStatus V1VolumeAttachment
instance HasOptionalParam ReplaceVolumeAttachmentStatus Pretty where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> Pretty
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
req (Pretty Text
xs) =
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
req KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"pretty", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceVolumeAttachmentStatus DryRun where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> DryRun
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
req (DryRun Text
xs) =
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
req KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"dryRun", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceVolumeAttachmentStatus FieldManager where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> FieldManager
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
req (FieldManager Text
xs) =
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
req KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldManager", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance HasOptionalParam ReplaceVolumeAttachmentStatus FieldValidation where
applyOptionalParam :: forall contentType res accept.
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> FieldValidation
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
applyOptionalParam KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
req (FieldValidation Text
xs) =
KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
req KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
-> [QueryItem]
-> KubernetesRequest
ReplaceVolumeAttachmentStatus contentType res accept
forall req contentType res accept.
KubernetesRequest req contentType res accept
-> [QueryItem] -> KubernetesRequest req contentType res accept
`addQuery` (Method, Maybe Text) -> [QueryItem]
forall a. ToHttpApiData a => (Method, Maybe a) -> [QueryItem]
toQuery (Method
"fieldValidation", Text -> Maybe Text
forall a. a -> Maybe a
Just Text
xs)
instance MimeType mtype => Consumes ReplaceVolumeAttachmentStatus mtype
instance Produces ReplaceVolumeAttachmentStatus MimeJSON
instance Produces ReplaceVolumeAttachmentStatus MimeVndKubernetesProtobuf
instance Produces ReplaceVolumeAttachmentStatus MimeCbor
instance Produces ReplaceVolumeAttachmentStatus MimeYaml