{-# LANGUAGE DataKinds #-}
{-# options_ghc -Wno-unused-imports #-}
-- | Common functions for the MS Azure API
--
module MSAzureAPI.Internal.Common (
  APIPlane(..)
  , get
  , getBs
  , getLbs
  , post
  -- ** URL parameters
  , (==:)
  -- ** Helpers
  , tryReq
  -- ** JSON
  , Collection
  , aesonOptions
  ) where

import Control.Monad.IO.Class (MonadIO(..))
import Data.Proxy (Proxy)
import GHC.Generics (Generic(..))

import Data.List (sort, sortBy, stripPrefix, uncons)
import Data.Maybe (listToMaybe, fromMaybe)
-- import Data.Ord (comparing)
import Data.Char (toLower)

-- aeson
import qualified Data.Aeson as A (ToJSON(..), FromJSON(..), genericParseJSON, defaultOptions, Options(..), withObject, withText, (.:), (.:?), object, (.=), Key, Value, camelTo2)
-- bytestring
import qualified Data.ByteString as BS (ByteString)
import qualified Data.ByteString.Char8 as BS8 (pack, unpack)
import qualified Data.ByteString.Lazy as LBS (ByteString)
import qualified Data.ByteString.Lazy.Char8 as LBS8 (pack, unpack, putStrLn)
-- hoauth2
import Network.OAuth.OAuth2 (OAuth2Token(..))
import Network.OAuth.OAuth2.Internal (AccessToken(..), ExchangeToken(..), RefreshToken(..), OAuth2Error, IdToken(..))
-- modern-uri
-- import Text.URI (URI, mkURI)
-- req
import Network.HTTP.Req (Req, runReq, HttpException(..), defaultHttpConfig, req, Option, (=:), GET(..), POST(..), Url, Scheme(..), useHttpsURI, https, (/:), ReqBodyJson(..), NoReqBody(..), oAuth2Bearer, HttpResponse(..), jsonResponse, JsonResponse, lbsResponse, LbsResponse, bsResponse, BsResponse, responseBody)
-- text
import Data.Text (Text, pack, unpack)
-- unliftio
import UnliftIO (MonadUnliftIO(..))
import UnliftIO.Exception (try)

-- | URL parameters
(==:) :: Text -- ^ key
      -> Text -- ^ value
      -> Option 'Https
==: :: Text -> Text -> Option 'Https
(==:) = forall param a.
(QueryParam param, ToHttpApiData a) =>
Text -> a -> param
(=:)

-- | @GET@ a 'LBS.ByteString' e.g. a file
getLbs :: APIPlane
       -> [Text] -- ^ URI path segments
       -> Option 'Https -> AccessToken -> Req LBS.ByteString
getLbs :: APIPlane
-> [Text] -> Option 'Https -> AccessToken -> Req ByteString
getLbs APIPlane
apiplane [Text]
paths Option 'Https
params AccessToken
tok = forall response.
HttpResponse response =>
response -> HttpResponseBody response
responseBody forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (m :: * -> *) method body response (scheme :: Scheme).
(MonadHttp m, HttpMethod method, HttpBody body,
 HttpResponse response,
 HttpBodyAllowed (AllowsBody method) (ProvidesBody body)) =>
method
-> Url scheme
-> body
-> Proxy response
-> Option scheme
-> m response
req GET
GET Url 'Https
url NoReqBody
NoReqBody Proxy LbsResponse
lbsResponse Option 'Https
opts
  where
    opts :: Option 'Https
opts = Option 'Https
auth forall a. Semigroup a => a -> a -> a
<> Option 'Https
params
    (Url 'Https
url, Option 'Https
auth) = APIPlane -> [Text] -> AccessToken -> (Url 'Https, Option 'Https)
msAzureReqConfig APIPlane
apiplane [Text]
paths AccessToken
tok

-- | @GET@ a 'BS.ByteString' e.g. a file
getBs :: APIPlane
      -> [Text] -- ^ URI path segments
      -> Option 'Https -> AccessToken -> Req BS.ByteString
getBs :: APIPlane
-> [Text] -> Option 'Https -> AccessToken -> Req ByteString
getBs APIPlane
apiplane [Text]
paths Option 'Https
params AccessToken
tok = forall response.
HttpResponse response =>
response -> HttpResponseBody response
responseBody forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (m :: * -> *) method body response (scheme :: Scheme).
(MonadHttp m, HttpMethod method, HttpBody body,
 HttpResponse response,
 HttpBodyAllowed (AllowsBody method) (ProvidesBody body)) =>
method
-> Url scheme
-> body
-> Proxy response
-> Option scheme
-> m response
req GET
GET Url 'Https
url NoReqBody
NoReqBody Proxy BsResponse
bsResponse Option 'Https
opts
  where
    opts :: Option 'Https
opts = Option 'Https
auth forall a. Semigroup a => a -> a -> a
<> Option 'Https
params
    (Url 'Https
url, Option 'Https
auth) = APIPlane -> [Text] -> AccessToken -> (Url 'Https, Option 'Https)
msAzureReqConfig APIPlane
apiplane [Text]
paths AccessToken
tok


-- | Specialized version of 'try' to 'HttpException's
--
-- This can be used to catch exceptions of composite 'Req' statements, e.g. around a @do@ block
tryReq :: Req a -> Req (Either HttpException a)
tryReq :: forall a. Req a -> Req (Either HttpException a)
tryReq = forall (m :: * -> *) e a.
(MonadUnliftIO m, Exception e) =>
m a -> m (Either e a)
try

-- | API control planes
--
-- https://learn.microsoft.com/en-us/azure/azure-resource-manager/management/control-plane-and-data-plane
data APIPlane = APManagement -- ^ Management plane (@management.azure.com@ endpoints)
              | APData Text -- ^ Data plane e.g. FileREST API

-- | @POST@
post :: (A.FromJSON b, A.ToJSON a) =>
        APIPlane
     -> [Text] -- ^ URI path segments
     -> Option 'Https
     -> a -- ^ request body
     -> AccessToken -> Req b
post :: forall b a.
(FromJSON b, ToJSON a) =>
APIPlane -> [Text] -> Option 'Https -> a -> AccessToken -> Req b
post APIPlane
apiplane [Text]
paths Option 'Https
params a
bdy AccessToken
tok = forall response.
HttpResponse response =>
response -> HttpResponseBody response
responseBody forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (m :: * -> *) method body response (scheme :: Scheme).
(MonadHttp m, HttpMethod method, HttpBody body,
 HttpResponse response,
 HttpBodyAllowed (AllowsBody method) (ProvidesBody body)) =>
method
-> Url scheme
-> body
-> Proxy response
-> Option scheme
-> m response
req POST
POST Url 'Https
url (forall a. a -> ReqBodyJson a
ReqBodyJson a
bdy) forall a. Proxy (JsonResponse a)
jsonResponse Option 'Https
opts
  where
    opts :: Option 'Https
opts = Option 'Https
auth forall a. Semigroup a => a -> a -> a
<> Option 'Https
params
    (Url 'Https
url, Option 'Https
auth) = APIPlane -> [Text] -> AccessToken -> (Url 'Https, Option 'Https)
msAzureReqConfig APIPlane
apiplane [Text]
paths AccessToken
tok

-- | @GET@
get :: (A.FromJSON b) =>
       APIPlane
    -> [Text] -- ^ URI path segments
    -> Option 'Https -> AccessToken -> Req b
get :: forall b.
FromJSON b =>
APIPlane -> [Text] -> Option 'Https -> AccessToken -> Req b
get APIPlane
apiplane [Text]
paths Option 'Https
params AccessToken
tok = forall response.
HttpResponse response =>
response -> HttpResponseBody response
responseBody forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (m :: * -> *) method body response (scheme :: Scheme).
(MonadHttp m, HttpMethod method, HttpBody body,
 HttpResponse response,
 HttpBodyAllowed (AllowsBody method) (ProvidesBody body)) =>
method
-> Url scheme
-> body
-> Proxy response
-> Option scheme
-> m response
req GET
GET Url 'Https
url NoReqBody
NoReqBody forall a. Proxy (JsonResponse a)
jsonResponse Option 'Https
opts
  where
    opts :: Option 'Https
opts = Option 'Https
auth forall a. Semigroup a => a -> a -> a
<> Option 'Https
params
    (Url 'Https
url, Option 'Https
auth) = APIPlane -> [Text] -> AccessToken -> (Url 'Https, Option 'Https)
msAzureReqConfig APIPlane
apiplane [Text]
paths AccessToken
tok

msAzureReqConfig :: APIPlane
                 -> [Text] -- ^ URI path segments
                 -> AccessToken
                 -> (Url 'Https, Option 'Https)
msAzureReqConfig :: APIPlane -> [Text] -> AccessToken -> (Url 'Https, Option 'Https)
msAzureReqConfig APIPlane
apiplane [Text]
uriRest (AccessToken Text
ttok) = (Url 'Https
url, Option 'Https
os)
  where
    urlBase :: Text
urlBase = case APIPlane
apiplane of
      APIPlane
APManagement -> Text
"management.azure.com"
      APData Text
ub -> Text
ub
    url :: Url 'Https
url = (Text -> Url 'Https
https Text
urlBase) forall (scheme :: Scheme). Url scheme -> [Text] -> Url scheme
//: [Text]
uriRest
    os :: Option 'Https
os = ByteString -> Option 'Https
oAuth2Bearer forall a b. (a -> b) -> a -> b
$ String -> ByteString
BS8.pack (Text -> String
unpack Text
ttok)



(//:) :: Url scheme -> [Text] -> Url scheme
//: :: forall (scheme :: Scheme). Url scheme -> [Text] -> Url scheme
(//:) = forall (t :: * -> *) b a.
Foldable t =>
(b -> a -> b) -> b -> t a -> b
foldl forall (scheme :: Scheme). Url scheme -> Text -> Url scheme
(/:)


-- * aeson

-- | a collection of items with key @value@
data Collection a = Collection {
  forall a. Collection a -> [a]
cValue :: [a]
                               } deriving (Collection a -> Collection a -> Bool
forall a. Eq a => Collection a -> Collection a -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Collection a -> Collection a -> Bool
$c/= :: forall a. Eq a => Collection a -> Collection a -> Bool
== :: Collection a -> Collection a -> Bool
$c== :: forall a. Eq a => Collection a -> Collection a -> Bool
Eq, Int -> Collection a -> ShowS
forall a. Show a => Int -> Collection a -> ShowS
forall a. Show a => [Collection a] -> ShowS
forall a. Show a => Collection a -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Collection a] -> ShowS
$cshowList :: forall a. Show a => [Collection a] -> ShowS
show :: Collection a -> String
$cshow :: forall a. Show a => Collection a -> String
showsPrec :: Int -> Collection a -> ShowS
$cshowsPrec :: forall a. Show a => Int -> Collection a -> ShowS
Show, forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall a x. Rep (Collection a) x -> Collection a
forall a x. Collection a -> Rep (Collection a) x
$cto :: forall a x. Rep (Collection a) x -> Collection a
$cfrom :: forall a x. Collection a -> Rep (Collection a) x
Generic)
instance A.FromJSON a => A.FromJSON (Collection a) where
  parseJSON :: Value -> Parser (Collection a)
parseJSON = forall a.
(Generic a, GFromJSON Zero (Rep a)) =>
Options -> Value -> Parser a
A.genericParseJSON (String -> Options
aesonOptions String
"c")

-- | drop the prefix and lowercase first character
--
-- e.g. @userDisplayName@ @->@ @displayName@
aesonOptions :: String -- ^ record prefix
             -> A.Options
aesonOptions :: String -> Options
aesonOptions String
pfx = Options
A.defaultOptions { fieldLabelModifier :: ShowS
A.fieldLabelModifier = String -> ShowS
recordName String
pfx }

-- | drop the prefix and lowercase first character
recordName :: String -- ^ record name prefix
           -> String -- ^ JSON field name
           -> String
recordName :: String -> ShowS
recordName String
pf String
str = case forall a. [a] -> Maybe (a, [a])
uncons forall a b. (a -> b) -> a -> b
$ forall a. Eq a => [a] -> [a] -> [a]
dropPrefix String
pf String
str of
  Just (Char
c, String
cs) -> Char -> Char
toLower Char
c forall a. a -> [a] -> [a]
: String
cs
  Maybe (Char, String)
_ -> forall a. HasCallStack => String -> a
error String
"record name cannot be empty"

-- | Drops the given prefix from a list.
--   It returns the original sequence if the sequence doesn't start with the given prefix.
--
-- > dropPrefix "Mr. " "Mr. Men" == "Men"
-- > dropPrefix "Mr. " "Dr. Men" == "Dr. Men"
dropPrefix :: Eq a => [a] -> [a] -> [a]
dropPrefix :: forall a. Eq a => [a] -> [a] -> [a]
dropPrefix [a]
a [a]
b = forall a. a -> Maybe a -> a
fromMaybe [a]
b forall a b. (a -> b) -> a -> b
$ forall a. Eq a => [a] -> [a] -> Maybe [a]
stripPrefix [a]
a [a]
b