Safe Haskell | None |
---|---|
Language | Haskell2010 |
GitHub.Data.Actions.WorkflowRuns
Documentation
data WorkflowRun Source #
Constructors
WorkflowRun | |
Fields
|
Instances
data RunAttempt Source #
Constructors
RunAttempt |
Instances
Data RunAttempt Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RunAttempt -> c RunAttempt # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RunAttempt # toConstr :: RunAttempt -> Constr # dataTypeOf :: RunAttempt -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RunAttempt) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RunAttempt) # gmapT :: (forall b. Data b => b -> b) -> RunAttempt -> RunAttempt # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RunAttempt -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RunAttempt -> r # gmapQ :: (forall d. Data d => d -> u) -> RunAttempt -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> RunAttempt -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RunAttempt -> m RunAttempt # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RunAttempt -> m RunAttempt # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RunAttempt -> m RunAttempt # | |||||
Generic RunAttempt Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Associated Types
| |||||
Show RunAttempt Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Methods showsPrec :: Int -> RunAttempt -> ShowS # show :: RunAttempt -> String # showList :: [RunAttempt] -> ShowS # | |||||
Eq RunAttempt Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns | |||||
Ord RunAttempt Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Methods compare :: RunAttempt -> RunAttempt -> Ordering # (<) :: RunAttempt -> RunAttempt -> Bool # (<=) :: RunAttempt -> RunAttempt -> Bool # (>) :: RunAttempt -> RunAttempt -> Bool # (>=) :: RunAttempt -> RunAttempt -> Bool # max :: RunAttempt -> RunAttempt -> RunAttempt # min :: RunAttempt -> RunAttempt -> RunAttempt # | |||||
type Rep RunAttempt Source # | |||||
data ReviewHistory Source #
Constructors
ReviewHistory | |
Fields |
Instances
FromJSON ReviewHistory Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Methods parseJSON :: Value -> Parser ReviewHistory # parseJSONList :: Value -> Parser [ReviewHistory] # | |||||
Data ReviewHistory Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ReviewHistory -> c ReviewHistory # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ReviewHistory # toConstr :: ReviewHistory -> Constr # dataTypeOf :: ReviewHistory -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ReviewHistory) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ReviewHistory) # gmapT :: (forall b. Data b => b -> b) -> ReviewHistory -> ReviewHistory # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ReviewHistory -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ReviewHistory -> r # gmapQ :: (forall d. Data d => d -> u) -> ReviewHistory -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ReviewHistory -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ReviewHistory -> m ReviewHistory # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ReviewHistory -> m ReviewHistory # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ReviewHistory -> m ReviewHistory # | |||||
Generic ReviewHistory Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Associated Types
| |||||
Show ReviewHistory Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Methods showsPrec :: Int -> ReviewHistory -> ShowS # show :: ReviewHistory -> String # showList :: [ReviewHistory] -> ShowS # | |||||
Eq ReviewHistory Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Methods (==) :: ReviewHistory -> ReviewHistory -> Bool # (/=) :: ReviewHistory -> ReviewHistory -> Bool # | |||||
Ord ReviewHistory Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns Methods compare :: ReviewHistory -> ReviewHistory -> Ordering # (<) :: ReviewHistory -> ReviewHistory -> Bool # (<=) :: ReviewHistory -> ReviewHistory -> Bool # (>) :: ReviewHistory -> ReviewHistory -> Bool # (>=) :: ReviewHistory -> ReviewHistory -> Bool # max :: ReviewHistory -> ReviewHistory -> ReviewHistory # min :: ReviewHistory -> ReviewHistory -> ReviewHistory # | |||||
type Rep ReviewHistory Source # | |||||
Defined in GitHub.Data.Actions.WorkflowRuns type Rep ReviewHistory = D1 ('MetaData "ReviewHistory" "GitHub.Data.Actions.WorkflowRuns" "github-0.30-7PDLbEAlB9u1WnWZZQOkWM" 'False) (C1 ('MetaCons "ReviewHistory" 'PrefixI 'True) (S1 ('MetaSel ('Just "reviewHistoryState") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "reviewHistoryComment") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "reviewHistoryUser") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SimpleUser)))) |