{-# LANGUAGE CPP #-}
module GitHub.Endpoints.Repos.Comments (
commentsForR,
commitCommentsForR,
commitCommentForR,
module GitHub.Data,
) where
import GitHub.Data
import GitHub.Internal.Prelude
import Prelude ()
commentsForR :: Name Owner -> Name Repo -> FetchCount -> Request k (Vector Comment)
commentsForR user repo =
pagedQuery ["repos", toPathPart user, toPathPart repo, "comments"] []
commitCommentsForR :: Name Owner -> Name Repo -> Name Commit -> FetchCount -> Request k (Vector Comment)
commitCommentsForR user repo sha =
pagedQuery ["repos", toPathPart user, toPathPart repo, "commits", toPathPart sha, "comments"] []
commitCommentForR :: Name Owner -> Name Repo -> Id Comment -> Request k Comment
commitCommentForR user repo cid =
query ["repos", toPathPart user, toPathPart repo, "comments", toPathPart cid] []