{-# 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.CustomObjects 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
createClusterCustomObject
:: (Consumes CreateClusterCustomObject contentType, MimeRender contentType Body)
=> ContentType contentType
-> Body
-> Group
-> Version
-> Plural
-> KubernetesRequest CreateClusterCustomObject contentType A.Value MimeJSON
createClusterCustomObject _ body (Group group) (Version version) (Plural plural) =
_mkRequest "POST" ["/apis/",toPath group,"/",toPath version,"/",toPath plural]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data CreateClusterCustomObject
instance HasBodyParam CreateClusterCustomObject Body
instance HasOptionalParam CreateClusterCustomObject Pretty where
applyOptionalParam req (Pretty xs) =
req `setQuery` toQuery ("pretty", Just xs)
instance MimeType mtype => Consumes CreateClusterCustomObject mtype
instance Produces CreateClusterCustomObject MimeJSON
createNamespacedCustomObject
:: (Consumes CreateNamespacedCustomObject contentType, MimeRender contentType Body)
=> ContentType contentType
-> Body
-> Group
-> Version
-> Namespace
-> Plural
-> KubernetesRequest CreateNamespacedCustomObject contentType A.Value MimeJSON
createNamespacedCustomObject _ body (Group group) (Version version) (Namespace namespace) (Plural plural) =
_mkRequest "POST" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data CreateNamespacedCustomObject
instance HasBodyParam CreateNamespacedCustomObject Body
instance HasOptionalParam CreateNamespacedCustomObject Pretty where
applyOptionalParam req (Pretty xs) =
req `setQuery` toQuery ("pretty", Just xs)
instance MimeType mtype => Consumes CreateNamespacedCustomObject mtype
instance Produces CreateNamespacedCustomObject MimeJSON
deleteClusterCustomObject
:: (Consumes DeleteClusterCustomObject contentType, MimeRender contentType V1DeleteOptions)
=> ContentType contentType
-> V1DeleteOptions
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest DeleteClusterCustomObject contentType A.Value MimeJSON
deleteClusterCustomObject _ body (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "DELETE" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data DeleteClusterCustomObject
instance HasBodyParam DeleteClusterCustomObject V1DeleteOptions
instance HasOptionalParam DeleteClusterCustomObject GracePeriodSeconds where
applyOptionalParam req (GracePeriodSeconds xs) =
req `setQuery` toQuery ("gracePeriodSeconds", Just xs)
instance HasOptionalParam DeleteClusterCustomObject OrphanDependents where
applyOptionalParam req (OrphanDependents xs) =
req `setQuery` toQuery ("orphanDependents", Just xs)
instance HasOptionalParam DeleteClusterCustomObject PropagationPolicy where
applyOptionalParam req (PropagationPolicy xs) =
req `setQuery` toQuery ("propagationPolicy", Just xs)
instance MimeType mtype => Consumes DeleteClusterCustomObject mtype
instance Produces DeleteClusterCustomObject MimeJSON
deleteNamespacedCustomObject
:: (Consumes DeleteNamespacedCustomObject contentType, MimeRender contentType V1DeleteOptions)
=> ContentType contentType
-> V1DeleteOptions
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest DeleteNamespacedCustomObject contentType A.Value MimeJSON
deleteNamespacedCustomObject _ body (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "DELETE" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data DeleteNamespacedCustomObject
instance HasBodyParam DeleteNamespacedCustomObject V1DeleteOptions
instance HasOptionalParam DeleteNamespacedCustomObject GracePeriodSeconds where
applyOptionalParam req (GracePeriodSeconds xs) =
req `setQuery` toQuery ("gracePeriodSeconds", Just xs)
instance HasOptionalParam DeleteNamespacedCustomObject OrphanDependents where
applyOptionalParam req (OrphanDependents xs) =
req `setQuery` toQuery ("orphanDependents", Just xs)
instance HasOptionalParam DeleteNamespacedCustomObject PropagationPolicy where
applyOptionalParam req (PropagationPolicy xs) =
req `setQuery` toQuery ("propagationPolicy", Just xs)
instance MimeType mtype => Consumes DeleteNamespacedCustomObject mtype
instance Produces DeleteNamespacedCustomObject MimeJSON
getClusterCustomObject
:: Group
-> Version
-> Plural
-> Name
-> KubernetesRequest GetClusterCustomObject MimeNoContent A.Value MimeJSON
getClusterCustomObject (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "GET" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data GetClusterCustomObject
instance Produces GetClusterCustomObject MimeJSON
getClusterCustomObjectScale
:: Accept accept
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest GetClusterCustomObjectScale MimeNoContent A.Value accept
getClusterCustomObjectScale _ (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "GET" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name,"/scale"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data GetClusterCustomObjectScale
instance Produces GetClusterCustomObjectScale MimeJSON
instance Produces GetClusterCustomObjectScale MimeVndKubernetesProtobuf
instance Produces GetClusterCustomObjectScale MimeYaml
getClusterCustomObjectStatus
:: Accept accept
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest GetClusterCustomObjectStatus MimeNoContent A.Value accept
getClusterCustomObjectStatus _ (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "GET" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name,"/status"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data GetClusterCustomObjectStatus
instance Produces GetClusterCustomObjectStatus MimeJSON
instance Produces GetClusterCustomObjectStatus MimeVndKubernetesProtobuf
instance Produces GetClusterCustomObjectStatus MimeYaml
getNamespacedCustomObject
:: Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest GetNamespacedCustomObject MimeNoContent A.Value MimeJSON
getNamespacedCustomObject (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "GET" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data GetNamespacedCustomObject
instance Produces GetNamespacedCustomObject MimeJSON
getNamespacedCustomObjectScale
:: Accept accept
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest GetNamespacedCustomObjectScale MimeNoContent A.Value accept
getNamespacedCustomObjectScale _ (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "GET" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name,"/scale"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data GetNamespacedCustomObjectScale
instance Produces GetNamespacedCustomObjectScale MimeJSON
instance Produces GetNamespacedCustomObjectScale MimeVndKubernetesProtobuf
instance Produces GetNamespacedCustomObjectScale MimeYaml
getNamespacedCustomObjectStatus
:: Accept accept
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest GetNamespacedCustomObjectStatus MimeNoContent A.Value accept
getNamespacedCustomObjectStatus _ (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "GET" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name,"/status"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data GetNamespacedCustomObjectStatus
instance Produces GetNamespacedCustomObjectStatus MimeJSON
instance Produces GetNamespacedCustomObjectStatus MimeVndKubernetesProtobuf
instance Produces GetNamespacedCustomObjectStatus MimeYaml
listClusterCustomObject
:: Accept accept
-> Group
-> Version
-> Plural
-> KubernetesRequest ListClusterCustomObject MimeNoContent A.Value accept
listClusterCustomObject _ (Group group) (Version version) (Plural plural) =
_mkRequest "GET" ["/apis/",toPath group,"/",toPath version,"/",toPath plural]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ListClusterCustomObject
instance HasOptionalParam ListClusterCustomObject Pretty where
applyOptionalParam req (Pretty xs) =
req `setQuery` toQuery ("pretty", Just xs)
instance HasOptionalParam ListClusterCustomObject FieldSelector where
applyOptionalParam req (FieldSelector xs) =
req `setQuery` toQuery ("fieldSelector", Just xs)
instance HasOptionalParam ListClusterCustomObject LabelSelector where
applyOptionalParam req (LabelSelector xs) =
req `setQuery` toQuery ("labelSelector", Just xs)
instance HasOptionalParam ListClusterCustomObject ResourceVersion where
applyOptionalParam req (ResourceVersion xs) =
req `setQuery` toQuery ("resourceVersion", Just xs)
instance HasOptionalParam ListClusterCustomObject TimeoutSeconds where
applyOptionalParam req (TimeoutSeconds xs) =
req `setQuery` toQuery ("timeoutSeconds", Just xs)
instance HasOptionalParam ListClusterCustomObject Watch where
applyOptionalParam req (Watch xs) =
req `setQuery` toQuery ("watch", Just xs)
instance Produces ListClusterCustomObject MimeJSON
instance Produces ListClusterCustomObject MimeJsonstreamwatch
listNamespacedCustomObject
:: Accept accept
-> Group
-> Version
-> Namespace
-> Plural
-> KubernetesRequest ListNamespacedCustomObject MimeNoContent A.Value accept
listNamespacedCustomObject _ (Group group) (Version version) (Namespace namespace) (Plural plural) =
_mkRequest "GET" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
data ListNamespacedCustomObject
instance HasOptionalParam ListNamespacedCustomObject Pretty where
applyOptionalParam req (Pretty xs) =
req `setQuery` toQuery ("pretty", Just xs)
instance HasOptionalParam ListNamespacedCustomObject FieldSelector where
applyOptionalParam req (FieldSelector xs) =
req `setQuery` toQuery ("fieldSelector", Just xs)
instance HasOptionalParam ListNamespacedCustomObject LabelSelector where
applyOptionalParam req (LabelSelector xs) =
req `setQuery` toQuery ("labelSelector", Just xs)
instance HasOptionalParam ListNamespacedCustomObject ResourceVersion where
applyOptionalParam req (ResourceVersion xs) =
req `setQuery` toQuery ("resourceVersion", Just xs)
instance HasOptionalParam ListNamespacedCustomObject TimeoutSeconds where
applyOptionalParam req (TimeoutSeconds xs) =
req `setQuery` toQuery ("timeoutSeconds", Just xs)
instance HasOptionalParam ListNamespacedCustomObject Watch where
applyOptionalParam req (Watch xs) =
req `setQuery` toQuery ("watch", Just xs)
instance Produces ListNamespacedCustomObject MimeJSON
instance Produces ListNamespacedCustomObject MimeJsonstreamwatch
patchClusterCustomObject
:: (Consumes PatchClusterCustomObject contentType, MimeRender contentType Body)
=> ContentType contentType
-> Body
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest PatchClusterCustomObject contentType A.Value MimeJSON
patchClusterCustomObject _ body (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "PATCH" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data PatchClusterCustomObject
instance HasBodyParam PatchClusterCustomObject Body
instance Consumes PatchClusterCustomObject MimeJsonPatchjson
instance Consumes PatchClusterCustomObject MimeMergePatchjson
instance Produces PatchClusterCustomObject MimeJSON
patchClusterCustomObjectScale
:: (Consumes PatchClusterCustomObjectScale contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest PatchClusterCustomObjectScale contentType A.Value accept
patchClusterCustomObjectScale _ _ body (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "PATCH" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name,"/scale"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data PatchClusterCustomObjectScale
instance HasBodyParam PatchClusterCustomObjectScale Body
instance Consumes PatchClusterCustomObjectScale MimeJsonPatchjson
instance Consumes PatchClusterCustomObjectScale MimeMergePatchjson
instance Produces PatchClusterCustomObjectScale MimeJSON
instance Produces PatchClusterCustomObjectScale MimeVndKubernetesProtobuf
instance Produces PatchClusterCustomObjectScale MimeYaml
patchClusterCustomObjectStatus
:: (Consumes PatchClusterCustomObjectStatus contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest PatchClusterCustomObjectStatus contentType A.Value accept
patchClusterCustomObjectStatus _ _ body (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "PATCH" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name,"/status"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data PatchClusterCustomObjectStatus
instance HasBodyParam PatchClusterCustomObjectStatus Body
instance Consumes PatchClusterCustomObjectStatus MimeJsonPatchjson
instance Consumes PatchClusterCustomObjectStatus MimeMergePatchjson
instance Produces PatchClusterCustomObjectStatus MimeJSON
instance Produces PatchClusterCustomObjectStatus MimeVndKubernetesProtobuf
instance Produces PatchClusterCustomObjectStatus MimeYaml
patchNamespacedCustomObject
:: (Consumes PatchNamespacedCustomObject contentType, MimeRender contentType Body)
=> ContentType contentType
-> Body
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest PatchNamespacedCustomObject contentType A.Value MimeJSON
patchNamespacedCustomObject _ body (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "PATCH" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data PatchNamespacedCustomObject
instance HasBodyParam PatchNamespacedCustomObject Body
instance Consumes PatchNamespacedCustomObject MimeJsonPatchjson
instance Consumes PatchNamespacedCustomObject MimeMergePatchjson
instance Produces PatchNamespacedCustomObject MimeJSON
patchNamespacedCustomObjectScale
:: (Consumes PatchNamespacedCustomObjectScale contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest PatchNamespacedCustomObjectScale contentType A.Value accept
patchNamespacedCustomObjectScale _ _ body (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "PATCH" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name,"/scale"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data PatchNamespacedCustomObjectScale
instance HasBodyParam PatchNamespacedCustomObjectScale Body
instance Consumes PatchNamespacedCustomObjectScale MimeJsonPatchjson
instance Consumes PatchNamespacedCustomObjectScale MimeMergePatchjson
instance Produces PatchNamespacedCustomObjectScale MimeJSON
instance Produces PatchNamespacedCustomObjectScale MimeVndKubernetesProtobuf
instance Produces PatchNamespacedCustomObjectScale MimeYaml
patchNamespacedCustomObjectStatus
:: (Consumes PatchNamespacedCustomObjectStatus contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest PatchNamespacedCustomObjectStatus contentType A.Value accept
patchNamespacedCustomObjectStatus _ _ body (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "PATCH" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name,"/status"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data PatchNamespacedCustomObjectStatus
instance HasBodyParam PatchNamespacedCustomObjectStatus Body
instance Consumes PatchNamespacedCustomObjectStatus MimeJsonPatchjson
instance Consumes PatchNamespacedCustomObjectStatus MimeMergePatchjson
instance Produces PatchNamespacedCustomObjectStatus MimeJSON
instance Produces PatchNamespacedCustomObjectStatus MimeVndKubernetesProtobuf
instance Produces PatchNamespacedCustomObjectStatus MimeYaml
replaceClusterCustomObject
:: (Consumes ReplaceClusterCustomObject contentType, MimeRender contentType Body)
=> ContentType contentType
-> Body
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest ReplaceClusterCustomObject contentType A.Value MimeJSON
replaceClusterCustomObject _ body (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "PUT" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data ReplaceClusterCustomObject
instance HasBodyParam ReplaceClusterCustomObject Body
instance MimeType mtype => Consumes ReplaceClusterCustomObject mtype
instance Produces ReplaceClusterCustomObject MimeJSON
replaceClusterCustomObjectScale
:: (Consumes ReplaceClusterCustomObjectScale contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest ReplaceClusterCustomObjectScale contentType A.Value accept
replaceClusterCustomObjectScale _ _ body (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "PUT" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name,"/scale"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data ReplaceClusterCustomObjectScale
instance HasBodyParam ReplaceClusterCustomObjectScale Body
instance MimeType mtype => Consumes ReplaceClusterCustomObjectScale mtype
instance Produces ReplaceClusterCustomObjectScale MimeJSON
instance Produces ReplaceClusterCustomObjectScale MimeVndKubernetesProtobuf
instance Produces ReplaceClusterCustomObjectScale MimeYaml
replaceClusterCustomObjectStatus
:: (Consumes ReplaceClusterCustomObjectStatus contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Group
-> Version
-> Plural
-> Name
-> KubernetesRequest ReplaceClusterCustomObjectStatus contentType A.Value accept
replaceClusterCustomObjectStatus _ _ body (Group group) (Version version) (Plural plural) (Name name) =
_mkRequest "PUT" ["/apis/",toPath group,"/",toPath version,"/",toPath plural,"/",toPath name,"/status"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data ReplaceClusterCustomObjectStatus
instance HasBodyParam ReplaceClusterCustomObjectStatus Body
instance MimeType mtype => Consumes ReplaceClusterCustomObjectStatus mtype
instance Produces ReplaceClusterCustomObjectStatus MimeJSON
instance Produces ReplaceClusterCustomObjectStatus MimeVndKubernetesProtobuf
instance Produces ReplaceClusterCustomObjectStatus MimeYaml
replaceNamespacedCustomObject
:: (Consumes ReplaceNamespacedCustomObject contentType, MimeRender contentType Body)
=> ContentType contentType
-> Body
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest ReplaceNamespacedCustomObject contentType A.Value MimeJSON
replaceNamespacedCustomObject _ body (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "PUT" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data ReplaceNamespacedCustomObject
instance HasBodyParam ReplaceNamespacedCustomObject Body
instance MimeType mtype => Consumes ReplaceNamespacedCustomObject mtype
instance Produces ReplaceNamespacedCustomObject MimeJSON
replaceNamespacedCustomObjectScale
:: (Consumes ReplaceNamespacedCustomObjectScale contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest ReplaceNamespacedCustomObjectScale contentType A.Value accept
replaceNamespacedCustomObjectScale _ _ body (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "PUT" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name,"/scale"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data ReplaceNamespacedCustomObjectScale
instance HasBodyParam ReplaceNamespacedCustomObjectScale Body
instance MimeType mtype => Consumes ReplaceNamespacedCustomObjectScale mtype
instance Produces ReplaceNamespacedCustomObjectScale MimeJSON
instance Produces ReplaceNamespacedCustomObjectScale MimeVndKubernetesProtobuf
instance Produces ReplaceNamespacedCustomObjectScale MimeYaml
replaceNamespacedCustomObjectStatus
:: (Consumes ReplaceNamespacedCustomObjectStatus contentType, MimeRender contentType Body)
=> ContentType contentType
-> Accept accept
-> Body
-> Group
-> Version
-> Namespace
-> Plural
-> Name
-> KubernetesRequest ReplaceNamespacedCustomObjectStatus contentType A.Value accept
replaceNamespacedCustomObjectStatus _ _ body (Group group) (Version version) (Namespace namespace) (Plural plural) (Name name) =
_mkRequest "PUT" ["/apis/",toPath group,"/",toPath version,"/namespaces/",toPath namespace,"/",toPath plural,"/",toPath name,"/status"]
`_hasAuthType` (P.Proxy :: P.Proxy AuthApiKeyBearerToken)
`setBodyParam` body
data ReplaceNamespacedCustomObjectStatus
instance HasBodyParam ReplaceNamespacedCustomObjectStatus Body
instance MimeType mtype => Consumes ReplaceNamespacedCustomObjectStatus mtype
instance Produces ReplaceNamespacedCustomObjectStatus MimeJSON
instance Produces ReplaceNamespacedCustomObjectStatus MimeVndKubernetesProtobuf
instance Produces ReplaceNamespacedCustomObjectStatus MimeYaml