github-0.29: Access to the GitHub API, v3.
Safe HaskellSafe-Inferred
LanguageHaskell2010

GitHub.Data.Actions.Secrets

Documentation

data OrganizationSecret Source #

Instances

Instances details
FromJSON OrganizationSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Data OrganizationSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrganizationSecret -> c OrganizationSecret #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrganizationSecret #

toConstr :: OrganizationSecret -> Constr #

dataTypeOf :: OrganizationSecret -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrganizationSecret) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrganizationSecret) #

gmapT :: (forall b. Data b => b -> b) -> OrganizationSecret -> OrganizationSecret #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrganizationSecret -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrganizationSecret -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrganizationSecret -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrganizationSecret -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrganizationSecret -> m OrganizationSecret #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrganizationSecret -> m OrganizationSecret #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrganizationSecret -> m OrganizationSecret #

Generic OrganizationSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Associated Types

type Rep OrganizationSecret :: Type -> Type #

Show OrganizationSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Eq OrganizationSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Ord OrganizationSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

FromJSON (WithTotalCount OrganizationSecret) Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep OrganizationSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep OrganizationSecret = D1 ('MetaData "OrganizationSecret" "GitHub.Data.Actions.Secrets" "github-0.29-8pCAynMhaqD8pNGAeWnyh4" 'False) (C1 ('MetaCons "OrganizationSecret" 'PrefixI 'True) ((S1 ('MetaSel ('Just "organizationSecretName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Name OrganizationSecret)) :*: S1 ('MetaSel ('Just "organizationSecretCreatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime)) :*: (S1 ('MetaSel ('Just "organizationSecretUpdatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "organizationSecretVisibility") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

data PublicKey Source #

Constructors

PublicKey 

Instances

Instances details
FromJSON PublicKey Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Data PublicKey Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PublicKey -> c PublicKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PublicKey #

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PublicKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PublicKey) #

gmapT :: (forall b. Data b => b -> b) -> PublicKey -> PublicKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PublicKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PublicKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

Generic PublicKey Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Associated Types

type Rep PublicKey :: Type -> Type #

Show PublicKey Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Eq PublicKey Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Ord PublicKey Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep PublicKey Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep PublicKey = D1 ('MetaData "PublicKey" "GitHub.Data.Actions.Secrets" "github-0.29-8pCAynMhaqD8pNGAeWnyh4" 'False) (C1 ('MetaCons "PublicKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "publicKeyId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "publicKeyKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))

data SetSecret Source #

Instances

Instances details
ToJSON SetSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Data SetSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SetSecret -> c SetSecret #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SetSecret #

toConstr :: SetSecret -> Constr #

dataTypeOf :: SetSecret -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SetSecret) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SetSecret) #

gmapT :: (forall b. Data b => b -> b) -> SetSecret -> SetSecret #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SetSecret -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SetSecret -> r #

gmapQ :: (forall d. Data d => d -> u) -> SetSecret -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SetSecret -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SetSecret -> m SetSecret #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SetSecret -> m SetSecret #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SetSecret -> m SetSecret #

Generic SetSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Associated Types

type Rep SetSecret :: Type -> Type #

Show SetSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Eq SetSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Ord SetSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep SetSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep SetSecret = D1 ('MetaData "SetSecret" "GitHub.Data.Actions.Secrets" "github-0.29-8pCAynMhaqD8pNGAeWnyh4" 'False) (C1 ('MetaCons "SetSecret" 'PrefixI 'True) ((S1 ('MetaSel ('Just "setSecretPublicKeyId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "setSecretEncryptedValue") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "setSecretVisibility") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "setSecretSelectedRepositoryIds") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe [Id Repo])))))

data SetRepoSecret Source #

Instances

Instances details
ToJSON SetRepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Data SetRepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SetRepoSecret -> c SetRepoSecret #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SetRepoSecret #

toConstr :: SetRepoSecret -> Constr #

dataTypeOf :: SetRepoSecret -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SetRepoSecret) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SetRepoSecret) #

gmapT :: (forall b. Data b => b -> b) -> SetRepoSecret -> SetRepoSecret #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SetRepoSecret -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SetRepoSecret -> r #

gmapQ :: (forall d. Data d => d -> u) -> SetRepoSecret -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SetRepoSecret -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SetRepoSecret -> m SetRepoSecret #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SetRepoSecret -> m SetRepoSecret #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SetRepoSecret -> m SetRepoSecret #

Generic SetRepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Associated Types

type Rep SetRepoSecret :: Type -> Type #

Show SetRepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Eq SetRepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Ord SetRepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep SetRepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep SetRepoSecret = D1 ('MetaData "SetRepoSecret" "GitHub.Data.Actions.Secrets" "github-0.29-8pCAynMhaqD8pNGAeWnyh4" 'False) (C1 ('MetaCons "SetRepoSecret" 'PrefixI 'True) (S1 ('MetaSel ('Just "setRepoSecretPublicKeyId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "setRepoSecretEncryptedValue") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))

data SelectedRepo Source #

Instances

Instances details
FromJSON SelectedRepo Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Data SelectedRepo Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelectedRepo -> c SelectedRepo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelectedRepo #

toConstr :: SelectedRepo -> Constr #

dataTypeOf :: SelectedRepo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelectedRepo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelectedRepo) #

gmapT :: (forall b. Data b => b -> b) -> SelectedRepo -> SelectedRepo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelectedRepo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelectedRepo -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelectedRepo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelectedRepo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelectedRepo -> m SelectedRepo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelectedRepo -> m SelectedRepo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelectedRepo -> m SelectedRepo #

Generic SelectedRepo Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Associated Types

type Rep SelectedRepo :: Type -> Type #

Show SelectedRepo Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Eq SelectedRepo Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Ord SelectedRepo Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

FromJSON (WithTotalCount SelectedRepo) Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep SelectedRepo Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep SelectedRepo = D1 ('MetaData "SelectedRepo" "GitHub.Data.Actions.Secrets" "github-0.29-8pCAynMhaqD8pNGAeWnyh4" 'False) (C1 ('MetaCons "SelectedRepo" 'PrefixI 'True) (S1 ('MetaSel ('Just "selectedRepoRepoId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Id Repo)) :*: S1 ('MetaSel ('Just "selectedRepoRepoName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Name Repo))))

data SetSelectedRepositories Source #

Instances

Instances details
ToJSON SetSelectedRepositories Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Data SetSelectedRepositories Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SetSelectedRepositories -> c SetSelectedRepositories #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SetSelectedRepositories #

toConstr :: SetSelectedRepositories -> Constr #

dataTypeOf :: SetSelectedRepositories -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SetSelectedRepositories) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SetSelectedRepositories) #

gmapT :: (forall b. Data b => b -> b) -> SetSelectedRepositories -> SetSelectedRepositories #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SetSelectedRepositories -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SetSelectedRepositories -> r #

gmapQ :: (forall d. Data d => d -> u) -> SetSelectedRepositories -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SetSelectedRepositories -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SetSelectedRepositories -> m SetSelectedRepositories #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SetSelectedRepositories -> m SetSelectedRepositories #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SetSelectedRepositories -> m SetSelectedRepositories #

Generic SetSelectedRepositories Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Associated Types

type Rep SetSelectedRepositories :: Type -> Type #

Show SetSelectedRepositories Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Eq SetSelectedRepositories Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Ord SetSelectedRepositories Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep SetSelectedRepositories Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep SetSelectedRepositories = D1 ('MetaData "SetSelectedRepositories" "GitHub.Data.Actions.Secrets" "github-0.29-8pCAynMhaqD8pNGAeWnyh4" 'False) (C1 ('MetaCons "SetSelectedRepositories" 'PrefixI 'True) (S1 ('MetaSel ('Just "setSelectedRepositoriesRepositoryIds") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Id Repo])))

data RepoSecret Source #

Instances

Instances details
FromJSON RepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Data RepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepoSecret -> c RepoSecret #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepoSecret #

toConstr :: RepoSecret -> Constr #

dataTypeOf :: RepoSecret -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepoSecret) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepoSecret) #

gmapT :: (forall b. Data b => b -> b) -> RepoSecret -> RepoSecret #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepoSecret -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepoSecret -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepoSecret -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepoSecret -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepoSecret -> m RepoSecret #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoSecret -> m RepoSecret #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoSecret -> m RepoSecret #

Generic RepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Associated Types

type Rep RepoSecret :: Type -> Type #

Show RepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Eq RepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Ord RepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

FromJSON (WithTotalCount RepoSecret) Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep RepoSecret Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep RepoSecret = D1 ('MetaData "RepoSecret" "GitHub.Data.Actions.Secrets" "github-0.29-8pCAynMhaqD8pNGAeWnyh4" 'False) (C1 ('MetaCons "RepoSecret" 'PrefixI 'True) (S1 ('MetaSel ('Just "repoSecretName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Name RepoSecret)) :*: (S1 ('MetaSel ('Just "repoSecretCreatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "repoSecretUpdatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime))))

data Environment Source #

Constructors

Environment 

Instances

Instances details
Data Environment Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Environment -> c Environment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Environment #

toConstr :: Environment -> Constr #

dataTypeOf :: Environment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Environment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Environment) #

gmapT :: (forall b. Data b => b -> b) -> Environment -> Environment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Environment -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Environment -> r #

gmapQ :: (forall d. Data d => d -> u) -> Environment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Environment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Environment -> m Environment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Environment -> m Environment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Environment -> m Environment #

Generic Environment Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Associated Types

type Rep Environment :: Type -> Type #

Show Environment Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Eq Environment Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

Ord Environment Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep Environment Source # 
Instance details

Defined in GitHub.Data.Actions.Secrets

type Rep Environment = D1 ('MetaData "Environment" "GitHub.Data.Actions.Secrets" "github-0.29-8pCAynMhaqD8pNGAeWnyh4" 'False) (C1 ('MetaCons "Environment" 'PrefixI 'False) (U1 :: Type -> Type))