github-0.16.0: Access to the GitHub API, v3.

LicenseBSD-3-Clause
MaintainerOleg Grenrus <oleg.grenrus@iki.fi>
Safe HaskellNone
LanguageHaskell2010

GitHub.Data.Issues

Description

 

Synopsis

Documentation

data Issue #

Instances

Eq Issue # 

Methods

(==) :: Issue -> Issue -> Bool #

(/=) :: Issue -> Issue -> Bool #

Data Issue # 

Methods

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

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

toConstr :: Issue -> Constr #

dataTypeOf :: Issue -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Issue # 

Methods

compare :: Issue -> Issue -> Ordering #

(<) :: Issue -> Issue -> Bool #

(<=) :: Issue -> Issue -> Bool #

(>) :: Issue -> Issue -> Bool #

(>=) :: Issue -> Issue -> Bool #

max :: Issue -> Issue -> Issue #

min :: Issue -> Issue -> Issue #

Show Issue # 

Methods

showsPrec :: Int -> Issue -> ShowS #

show :: Issue -> String #

showList :: [Issue] -> ShowS #

Generic Issue # 

Associated Types

type Rep Issue :: * -> * #

Methods

from :: Issue -> Rep Issue x #

to :: Rep Issue x -> Issue #

FromJSON Issue # 
Binary Issue # 

Methods

put :: Issue -> Put #

get :: Get Issue #

putList :: [Issue] -> Put #

NFData Issue # 

Methods

rnf :: Issue -> () #

type Rep Issue # 
type Rep Issue = D1 (MetaData "Issue" "GitHub.Data.Issues" "github-0.16.0-1eEADOe6VzR9O6v5ijkXoG" False) (C1 (MetaCons "Issue" PrefixI True) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "issueClosedAt") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UTCTime))) (S1 (MetaSel (Just Symbol "issueUpdatedAt") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 UTCTime))) ((:*:) (S1 (MetaSel (Just Symbol "issueEventsUrl") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 URL)) (S1 (MetaSel (Just Symbol "issueHtmlUrl") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe URL))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "issueClosedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SimpleUser))) (S1 (MetaSel (Just Symbol "issueLabels") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Vector IssueLabel)))) ((:*:) (S1 (MetaSel (Just Symbol "issueNumber") NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 Int)) ((:*:) (S1 (MetaSel (Just Symbol "issueAssignees") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Vector SimpleUser))) (S1 (MetaSel (Just Symbol "issueUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 SimpleUser)))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "issueTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "issuePullRequest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PullRequestReference)))) ((:*:) (S1 (MetaSel (Just Symbol "issueUrl") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 URL)) (S1 (MetaSel (Just Symbol "issueCreatedAt") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 UTCTime)))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "issueBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "issueState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 IssueState))) ((:*:) (S1 (MetaSel (Just Symbol "issueId") NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 (Id Issue))) ((:*:) (S1 (MetaSel (Just Symbol "issueComments") NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 Int)) (S1 (MetaSel (Just Symbol "issueMilestone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Milestone)))))))))

data NewIssue #

Instances

Eq NewIssue # 
Data NewIssue # 

Methods

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

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

toConstr :: NewIssue -> Constr #

dataTypeOf :: NewIssue -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NewIssue # 
Show NewIssue # 
Generic NewIssue # 

Associated Types

type Rep NewIssue :: * -> * #

Methods

from :: NewIssue -> Rep NewIssue x #

to :: Rep NewIssue x -> NewIssue #

ToJSON NewIssue # 
Binary NewIssue # 

Methods

put :: NewIssue -> Put #

get :: Get NewIssue #

putList :: [NewIssue] -> Put #

NFData NewIssue # 

Methods

rnf :: NewIssue -> () #

type Rep NewIssue # 

data EditIssue #

Instances

Eq EditIssue # 
Data EditIssue # 

Methods

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

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

toConstr :: EditIssue -> Constr #

dataTypeOf :: EditIssue -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EditIssue # 
Show EditIssue # 
Generic EditIssue # 

Associated Types

type Rep EditIssue :: * -> * #

ToJSON EditIssue # 
Binary EditIssue # 
NFData EditIssue # 

Methods

rnf :: EditIssue -> () #

type Rep EditIssue # 

data IssueComment #

Instances

Eq IssueComment # 
Data IssueComment # 

Methods

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

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

toConstr :: IssueComment -> Constr #

dataTypeOf :: IssueComment -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord IssueComment # 
Show IssueComment # 
Generic IssueComment # 

Associated Types

type Rep IssueComment :: * -> * #

FromJSON IssueComment # 
Binary IssueComment # 
NFData IssueComment # 

Methods

rnf :: IssueComment -> () #

type Rep IssueComment # 

data EventType #

Constructors

Mentioned

The actor was @mentioned in an issue body.

Subscribed

The actor subscribed to receive notifications for an issue.

Unsubscribed

The issue was unsubscribed from by the actor.

Referenced

The issue was referenced from a commit message. The commit_id attribute is the commit SHA1 of where that happened.

Merged

The issue was merged by the actor. The commit_id attribute is the SHA1 of the HEAD commit that was merged.

Assigned

The issue was assigned to the actor.

Closed

The issue was closed by the actor. When the commit_id is present, it identifies the commit that closed the issue using “closes / fixes #NN” syntax.

Reopened

The issue was reopened by the actor.

ActorUnassigned

The issue was unassigned to the actor

Labeled

A label was added to the issue.

Unlabeled

A label was removed from the issue.

Milestoned

The issue was added to a milestone.

Demilestoned

The issue was removed from a milestone.

Renamed

The issue title was changed.

Locked

The issue was locked by the actor.

Unlocked

The issue was unlocked by the actor.

HeadRefDeleted

The pull request’s branch was deleted.

HeadRefRestored

The pull request’s branch was restored.

Instances

Bounded EventType # 
Enum EventType # 
Eq EventType # 
Data EventType # 

Methods

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

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

toConstr :: EventType -> Constr #

dataTypeOf :: EventType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EventType # 
Show EventType # 
Generic EventType # 

Associated Types

type Rep EventType :: * -> * #

FromJSON EventType # 
Binary EventType # 
NFData EventType # 

Methods

rnf :: EventType -> () #

type Rep EventType # 
type Rep EventType = D1 (MetaData "EventType" "GitHub.Data.Issues" "github-0.16.0-1eEADOe6VzR9O6v5ijkXoG" False) ((:+:) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "Mentioned" PrefixI False) U1) (C1 (MetaCons "Subscribed" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Unsubscribed" PrefixI False) U1) (C1 (MetaCons "Referenced" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "Merged" PrefixI False) U1) (C1 (MetaCons "Assigned" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Closed" PrefixI False) U1) ((:+:) (C1 (MetaCons "Reopened" PrefixI False) U1) (C1 (MetaCons "ActorUnassigned" PrefixI False) U1))))) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "Labeled" PrefixI False) U1) (C1 (MetaCons "Unlabeled" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Milestoned" PrefixI False) U1) (C1 (MetaCons "Demilestoned" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "Renamed" PrefixI False) U1) (C1 (MetaCons "Locked" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Unlocked" PrefixI False) U1) ((:+:) (C1 (MetaCons "HeadRefDeleted" PrefixI False) U1) (C1 (MetaCons "HeadRefRestored" PrefixI False) U1))))))

data IssueEvent #

Issue event

Instances

Eq IssueEvent # 
Data IssueEvent # 

Methods

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

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

toConstr :: IssueEvent -> Constr #

dataTypeOf :: IssueEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord IssueEvent # 
Show IssueEvent # 
Generic IssueEvent # 

Associated Types

type Rep IssueEvent :: * -> * #

FromJSON IssueEvent # 
Binary IssueEvent # 
NFData IssueEvent # 

Methods

rnf :: IssueEvent -> () #

type Rep IssueEvent #