module GitHub.Endpoints.Activity.Notifications where
import GitHub.Data
import GitHub.Internal.Prelude
import GitHub.Request
import Prelude ()
getNotifications :: Auth -> IO (Either Error (Vector Notification))
getNotifications auth =
    executeRequest auth $ getNotificationsR FetchAll
getNotificationsR :: FetchCount -> Request 'RA (Vector Notification)
getNotificationsR = pagedQuery ["notifications"] []
markNotificationAsRead :: Auth -> Id Notification -> IO (Either Error ())
markNotificationAsRead auth nid =
    executeRequest auth $ markNotificationAsReadR nid
markNotificationAsReadR :: Id Notification -> GenRequest 'MtUnit 'RW ()
markNotificationAsReadR nid = Command
    Patch
    ["notifications", "threads", toPathPart nid]
    (encode ())
markNotificationsAsRead :: Auth -> IO (Either Error ())
markNotificationsAsRead auth =
  executeRequest auth markAllNotificationsAsReadR
markAllNotificationsAsReadR :: GenRequest 'MtUnit 'RW ()
markAllNotificationsAsReadR =
    Command Put ["notifications"] $ encode emptyObject