{-# LANGUAGE DataKinds         #-}
{-# LANGUAGE OverloadedStrings #-}
module GitHub.Paths.Repos where

import           Data.Aeson          (Value, encode)
import           Data.Text           (Text)
import           GitHub.Data.Request (CommandMethod (Patch), RW (..), Request,
                                      command)

editRepoR :: Text -> Text -> Value -> Request 'RW Value
editRepoR :: Text -> Text -> Value -> Request 'RW Value
editRepoR Text
user Text
repo =
    CommandMethod -> Paths -> ByteString -> Request 'RW Value
forall a. CommandMethod -> Paths -> ByteString -> Request 'RW a
command CommandMethod
Patch [Text
"repos", Text
user, Text
repo] (ByteString -> Request 'RW Value)
-> (Value -> ByteString) -> Value -> Request 'RW Value
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Value -> ByteString
forall a. ToJSON a => a -> ByteString
encode