github-0.28.0.1: Access to the GitHub API, v3.
LicenseBSD-3-Clause
MaintainerOleg Grenrus <oleg.grenrus@iki.fi>
Safe HaskellNone
LanguageHaskell2010

GitHub.Data.Enterprise.Organizations

Description

 

Documentation

data CreateOrganization Source #

Instances

Instances details
Eq CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Data CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Methods

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

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

toConstr :: CreateOrganization -> Constr #

dataTypeOf :: CreateOrganization -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Show CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Generic CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Associated Types

type Rep CreateOrganization :: Type -> Type #

ToJSON CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Binary CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

NFData CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Methods

rnf :: CreateOrganization -> () #

type Rep CreateOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

type Rep CreateOrganization = D1 ('MetaData "CreateOrganization" "GitHub.Data.Enterprise.Organizations" "github-0.28.0.1-Ane44df1Z4EB2fvYeVzY0Q" 'False) (C1 ('MetaCons "CreateOrganization" 'PrefixI 'True) (S1 ('MetaSel ('Just "createOrganizationLogin") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Name Organization)) :*: (S1 ('MetaSel ('Just "createOrganizationAdmin") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Name User)) :*: S1 ('MetaSel ('Just "createOrganizationProfileName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Text)))))

data RenameOrganization Source #

Instances

Instances details
Eq RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Data RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Methods

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

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

toConstr :: RenameOrganization -> Constr #

dataTypeOf :: RenameOrganization -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Show RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Generic RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Associated Types

type Rep RenameOrganization :: Type -> Type #

ToJSON RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Binary RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

NFData RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Methods

rnf :: RenameOrganization -> () #

type Rep RenameOrganization Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

type Rep RenameOrganization = D1 ('MetaData "RenameOrganization" "GitHub.Data.Enterprise.Organizations" "github-0.28.0.1-Ane44df1Z4EB2fvYeVzY0Q" 'False) (C1 ('MetaCons "RenameOrganization" 'PrefixI 'True) (S1 ('MetaSel ('Just "renameOrganizationLogin") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Name Organization))))

data RenameOrganizationResponse Source #

Instances

Instances details
Eq RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Data RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Methods

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

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

toConstr :: RenameOrganizationResponse -> Constr #

dataTypeOf :: RenameOrganizationResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Show RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Generic RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Associated Types

type Rep RenameOrganizationResponse :: Type -> Type #

FromJSON RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

Binary RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

NFData RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

type Rep RenameOrganizationResponse Source # 
Instance details

Defined in GitHub.Data.Enterprise.Organizations

type Rep RenameOrganizationResponse = D1 ('MetaData "RenameOrganizationResponse" "GitHub.Data.Enterprise.Organizations" "github-0.28.0.1-Ane44df1Z4EB2fvYeVzY0Q" 'False) (C1 ('MetaCons "RenameOrganizationResponse" 'PrefixI 'True) (S1 ('MetaSel ('Just "renameOrganizationResponseMessage") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "renameOrganizationResponseUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL)))