about summary refs log tree commit diff
path: root/users/Profpatsch
diff options
context:
space:
mode:
authorProfpatsch <mail@profpatsch.de>2023-06-29T14·36+0200
committerProfpatsch <mail@profpatsch.de>2023-07-14T08·03+0000
commit4ec27ed0886f4e727d881e19525c5cad2b9a123e (patch)
tree433f7eac6101b2e0faf45f7880441d2ce718d08d /users/Profpatsch
parentfa0b7d08040771ef7079f423c024fa446b62a230 (diff)
feat(users/Profpatsch/whatcd-resolver): Display transmission torrent r/6419
Change-Id: I1a45dd4c7fa798c161545abf545017be1f83a8f9
Reviewed-on: https://cl.tvl.fyi/c/depot/+/8873
Reviewed-by: Profpatsch <mail@profpatsch.de>
Tested-by: BuildkiteCI
Diffstat (limited to 'users/Profpatsch')
-rw-r--r--users/Profpatsch/whatcd-resolver/src/WhatcdResolver.hs80
1 files changed, 64 insertions, 16 deletions
diff --git a/users/Profpatsch/whatcd-resolver/src/WhatcdResolver.hs b/users/Profpatsch/whatcd-resolver/src/WhatcdResolver.hs
index d3b02e2280..fee64b62f2 100644
--- a/users/Profpatsch/whatcd-resolver/src/WhatcdResolver.hs
+++ b/users/Profpatsch/whatcd-resolver/src/WhatcdResolver.hs
@@ -12,6 +12,7 @@ import Data.Aeson qualified as Json
 import Data.Aeson.BetterErrors qualified as Json
 import Data.Aeson.KeyMap qualified as KeyMap
 import Data.Error.Tree
+import Data.List qualified as List
 import Data.List.NonEmpty qualified as NonEmpty
 import Data.Map.Strict qualified as Map
 import Data.Pool (Pool)
@@ -47,16 +48,20 @@ import System.Directory qualified as Xdg
 import System.FilePath ((</>))
 import System.IO qualified as IO
 import Text.Blaze.Html (Html)
+import Text.Blaze.Html.Renderer.Pretty qualified as Html.Pretty
 import Text.Blaze.Html.Renderer.Utf8 qualified as Html
 import Text.Blaze.Html5 qualified as Html
 import UnliftIO
 
 htmlUi :: App ()
 htmlUi = do
+  let debug = True
   withRunInIO $ \runInIO -> Warp.run 8080 $ \req resp -> do
+    let renderHtml = if debug then toLazyBytes . textToBytesUtf8 . stringToText . Html.Pretty.renderHtml else Html.renderHtml
     let h act = do
           res <- runInIO act
-          resp . Wai.responseLBS Http.ok200 [("Content-Type", "text/html")] . Html.renderHtml $ res
+          resp . Wai.responseLBS Http.ok200 [("Content-Type", "text/html")] . renderHtml $ res
+
     let mp parser =
           Multipart.parseMultipartOrThrow
             appThrowTree
@@ -65,7 +70,6 @@ htmlUi = do
 
     case req & Wai.pathInfo & Text.intercalate "/" of
       "" -> h mainHtml
-      "snips/song" -> h snipsSong
       "snips/redacted/search" -> do
         h $ do
           dat <-
@@ -85,6 +89,7 @@ htmlUi = do
   where
     mainHtml = runTransaction $ do
       bestTorrentsTable <- getBestTorrentsTable
+      transmissionTorrentsTable <- lift @Transaction getTransmissionTorrentsTable
       pure $
         Html.docTypeHtml
           [hsx|
@@ -109,9 +114,11 @@ htmlUi = do
         <div id="redacted-search-results">
           {bestTorrentsTable}
         </div>
+        <div id="transmission-torrents">
+          {transmissionTorrentsTable}
+        </div>
       </body>
     |]
-    snipsSong = todo
 
 snipsRedactedSearch ::
   ( MonadLogger m,
@@ -152,12 +159,14 @@ getBestTorrentsTable = do
     [hsx|
         <table class="table">
           <thead>
-            <th>Group ID</th>
-            <th>Artist</th>
-            <th>Name</th>
-            <th>Weight</th>
-            <th>Torrent</th>
-            <th>Torrent Group</th>
+            <tr>
+              <th>Group ID</th>
+              <th>Artist</th>
+              <th>Name</th>
+              <th>Weight</th>
+              <th>Torrent</th>
+              <th>Torrent Group</th>
+            </tr>
           </thead>
           <tbody>
             {bestRows}
@@ -165,6 +174,35 @@ getBestTorrentsTable = do
         </table>
       |]
 
+getTransmissionTorrentsTable ::
+  (MonadIO m, MonadTransmission m, MonadThrow m) =>
+  m Html
+getTransmissionTorrentsTable = do
+  let fields = ["id", "name", "files", "fileStats"]
+  resp <- doTransmissionRequest transmissionConnectionConfig (requestListAllTorrents fields)
+  case resp.result of
+    TransmissionResponseFailure err -> appThrowTree (nestedError "Transmission RPC error" $ singleError $ newError err)
+    TransmissionResponseSuccess ->
+      resp.arguments
+        & Map.lookup "torrents"
+        & annotate [fmt|Missing field "torrents"|]
+        & orAppThrowTree
+        <&> Json.parseValue (Json.eachInArray (Json.asObject <&> KeyMap.toMapText))
+        <&> first (Json.parseErrorTree "Cannot parse transmission torrents")
+        >>= \case
+          Left err -> appThrowTree err
+          Right a ->
+            pure $
+              toTable
+                ( a
+                    <&> Map.toList
+                    -- TODO
+                    & List.take 3
+                )
+
+zipNonEmpty :: NonEmpty a -> NonEmpty b -> NonEmpty (a, b)
+zipNonEmpty (a :| as) (b :| bs) = (a, b) :| zip as bs
+
 mkVal :: Json.Value -> Html
 mkVal = \case
   Json.Number n -> Html.toHtml @Text $ showToText n
@@ -174,13 +212,13 @@ mkVal = \case
   Json.Null -> [hsx|<em>null</em>|]
   Json.Array arr ->
     arr
-      & foldMap (\el -> Html.ul $ mkVal el)
+      & foldMap (\el -> Html.li $ mkVal el)
       & Html.ol
   Json.Object obj ->
     obj
       & KeyMap.toMapText
       & Map.toList
-      & foldMap (\(k, v) -> Html.dt (Html.toHtml @Text k <> Html.dd (mkVal v)))
+      & foldMap (\(k, v) -> Html.dt (Html.toHtml @Text k) <> Html.dd (mkVal v))
       & Html.dl
 
 toTable :: [[(Text, Json.Value)]] -> Html
@@ -190,11 +228,13 @@ toTable xs =
       [hsx|<p>No results.</p>|]
     Just xs' -> do
       let headers = xs' & NonEmpty.head <&> fst <&> (\h -> [hsx|<th>{h}</th>|]) & mconcat
-      let vals = xs' <&> fmap (mkVal . snd)
+      let vals = xs' & foldMap (Html.tr . foldMap (Html.td . mkVal . snd))
       [hsx|
               <table class="table">
                 <thead>
+                  <tr>
                   {headers}
+                  </tr>
                 </thead>
                 <tbody>
                   {vals}
@@ -210,15 +250,18 @@ data TransmissionRequest = TransmissionRequest
   deriving stock (Show)
 
 testTransmission :: TransmissionRequest -> IO (Either TmpPg.StartError ())
-testTransmission req = runAppWith $ doTransmissionRequest (T2 (label @"host" "localhost") (label @"port" "9091")) req >>= liftIO . printPretty
+testTransmission req = runAppWith $ doTransmissionRequest transmissionConnectionConfig req >>= liftIO . printPretty
+
+transmissionConnectionConfig :: T2 "host" Text "port" Text
+transmissionConnectionConfig = (T2 (label @"host" "localhost") (label @"port" "9091"))
 
-requestListAllTorrents :: TransmissionRequest
-requestListAllTorrents =
+requestListAllTorrents :: [Text] -> TransmissionRequest
+requestListAllTorrents fields =
   TransmissionRequest
     { method = "torrent-get",
       arguments =
         Map.fromList
-          [ ("fields", Enc.list Enc.text ["id", "name", "files", "fileStats"])
+          [ ("fields", Enc.list Enc.text fields)
           ],
       tag = Nothing
     }
@@ -652,6 +695,11 @@ data AppException = AppException Text
 appThrowTree :: MonadThrow m => ErrorTree -> m a
 appThrowTree exc = throwM $ AppException $ prettyErrorTree exc
 
+orAppThrowTree :: MonadThrow m => Either ErrorTree a -> m a
+orAppThrowTree = \case
+  Left err -> appThrowTree err
+  Right a -> pure a
+
 instance MonadIO m => MonadLogger (AppT m) where
   monadLoggerLog loc src lvl msg = liftIO $ Logger.defaultOutput IO.stderr loc src lvl (Logger.toLogStr msg)