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.Milestone

Description

 

Documentation

data Milestone Source #

Instances

Instances details
Eq Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Data Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Methods

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

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

toConstr :: Milestone -> Constr #

dataTypeOf :: Milestone -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Show Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Generic Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Associated Types

type Rep Milestone :: Type -> Type #

FromJSON Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Binary Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

NFData Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Methods

rnf :: Milestone -> () #

type Rep Milestone Source # 
Instance details

Defined in GitHub.Data.Milestone

type Rep Milestone = D1 ('MetaData "Milestone" "GitHub.Data.Milestone" "github-0.28.0.1-Ane44df1Z4EB2fvYeVzY0Q" 'False) (C1 ('MetaCons "Milestone" 'PrefixI 'True) (((S1 ('MetaSel ('Just "milestoneCreator") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SimpleUser) :*: S1 ('MetaSel ('Just "milestoneDueOn") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime))) :*: (S1 ('MetaSel ('Just "milestoneOpenIssues") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: (S1 ('MetaSel ('Just "milestoneNumber") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Id Milestone)) :*: S1 ('MetaSel ('Just "milestoneClosedIssues") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int)))) :*: ((S1 ('MetaSel ('Just "milestoneDescription") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "milestoneTitle") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "milestoneUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL) :*: (S1 ('MetaSel ('Just "milestoneCreatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "milestoneState") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))))

data NewMilestone Source #

Instances

Instances details
Eq NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Data NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Methods

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

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

toConstr :: NewMilestone -> Constr #

dataTypeOf :: NewMilestone -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Show NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Generic NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Associated Types

type Rep NewMilestone :: Type -> Type #

ToJSON NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Binary NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

NFData NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Methods

rnf :: NewMilestone -> () #

type Rep NewMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

type Rep NewMilestone = D1 ('MetaData "NewMilestone" "GitHub.Data.Milestone" "github-0.28.0.1-Ane44df1Z4EB2fvYeVzY0Q" 'False) (C1 ('MetaCons "NewMilestone" 'PrefixI 'True) ((S1 ('MetaSel ('Just "newMilestoneTitle") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "newMilestoneState") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "newMilestoneDescription") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "newMilestoneDueOn") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime)))))

data UpdateMilestone Source #

Instances

Instances details
Eq UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Data UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Methods

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

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

toConstr :: UpdateMilestone -> Constr #

dataTypeOf :: UpdateMilestone -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Show UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Generic UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Associated Types

type Rep UpdateMilestone :: Type -> Type #

ToJSON UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Binary UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

NFData UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

Methods

rnf :: UpdateMilestone -> () #

type Rep UpdateMilestone Source # 
Instance details

Defined in GitHub.Data.Milestone

type Rep UpdateMilestone = D1 ('MetaData "UpdateMilestone" "GitHub.Data.Milestone" "github-0.28.0.1-Ane44df1Z4EB2fvYeVzY0Q" 'False) (C1 ('MetaCons "UpdateMilestone" 'PrefixI 'True) ((S1 ('MetaSel ('Just "updateMilestoneTitle") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "updateMilestoneState") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "updateMilestoneDescription") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "updateMilestoneDueOn") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime)))))