about summary refs log tree commit diff
diff options
context:
space:
mode:
authorProfpatsch <mail@profpatsch.de>2023-01-08T22·49+0100
committerProfpatsch <mail@profpatsch.de>2023-01-08T23·10+0000
commit48686ca0d60e5be1d909ee9921ce66152367eb2d (patch)
tree8aae1e452fe66fd99c207e7e9f048ec6d70b5f65
parentcd40585ea4481625ed8c198ee56ce2e453a1cd9c (diff)
feat(users/Profpatsch/mailbox-org): Set up passing of sieve-test r/5633
Implement a parser for tools, and instantiate once for
arglib-netencode arguments (parsed by the new netencode parser) and
one just from the PATH for testing from the repl.

Change-Id: Id0cf264100123a87700880c7230d68426224fd0d
Reviewed-on: https://cl.tvl.fyi/c/depot/+/7798
Reviewed-by: Profpatsch <mail@profpatsch.de>
Tested-by: BuildkiteCI
-rw-r--r--users/Profpatsch/mailbox-org/MailboxOrg.hs112
-rw-r--r--users/Profpatsch/mailbox-org/default.nix30
-rw-r--r--users/Profpatsch/mailbox-org/mailbox-org.cabal10
3 files changed, 136 insertions, 16 deletions
diff --git a/users/Profpatsch/mailbox-org/MailboxOrg.hs b/users/Profpatsch/mailbox-org/MailboxOrg.hs
index 62277f192a..9954f3b057 100644
--- a/users/Profpatsch/mailbox-org/MailboxOrg.hs
+++ b/users/Profpatsch/mailbox-org/MailboxOrg.hs
@@ -1,37 +1,48 @@
+{-# LANGUAGE ApplicativeDo #-}
 {-# LANGUAGE DataKinds #-}
 {-# LANGUAGE DerivingStrategies #-}
+{-# LANGUAGE DerivingVia #-}
 {-# LANGUAGE GHC2021 #-}
 {-# LANGUAGE LambdaCase #-}
 {-# LANGUAGE OverloadedRecordDot #-}
 {-# LANGUAGE OverloadedStrings #-}
 {-# LANGUAGE QuasiQuotes #-}
 {-# LANGUAGE RecordWildCards #-}
+{-# LANGUAGE NoFieldSelectors #-}
 {-# OPTIONS_GHC -Wall #-}
 
 module Main where
 
 import Aeson (parseErrorTree)
+import Control.Exception (try)
 import Control.Monad (replicateM)
 import Data.Aeson qualified as Json
 import Data.Aeson.BetterErrors qualified as Json
 import Data.Aeson.KeyMap qualified as KeyMap
 import Data.ByteString qualified as ByteString
 import Data.ByteString.Char8 qualified as Char8
-import Data.Error.Tree (prettyErrorTree)
+import Data.Error.Tree
+import Data.Functor.Compose
 import Data.List qualified as List
 import Data.Map.Strict qualified as Map
+import Data.Text qualified as Text
 import ExecHelpers
 import GHC.Records (HasField (..))
 import Label
 import MyPrelude
+import Netencode qualified
 import Network.HTTP.Conduit qualified as Client
 import Network.HTTP.Simple qualified as Client
 import Pretty
+import System.Directory qualified as File
+import System.Environment qualified as Env
 import System.Exit qualified as Exit
+import System.FilePath ((</>))
 import System.Process qualified as Proc
 import System.Random qualified as Random
 import System.Random.Stateful qualified as Random
 import Prelude hiding (log)
+import qualified Netencode.Parse as NetParse
 
 secret :: IO (T2 "email" ByteString "password" ByteString)
 secret = do
@@ -52,6 +63,93 @@ log :: Error -> IO ()
 log err = do
   putStderrLn (errorContext progName.unCurrentProgramName err & prettyError)
 
+data Tools = Tools
+  { sieveTest :: Tool
+  }
+  deriving stock (Show)
+
+newtype Tool = Tool FilePath
+  deriving stock Show
+
+parseTools :: Applicative m => (Text -> m (Either Error Tool)) -> m (Either ErrorTree Tools)
+parseTools getTool = do
+  ( do
+        sieveTest <- get "sieve-test"
+        pure Tools {..}
+    ).getCompose <&> first (errorTree "Error reading tools") <&> validationToEither
+
+  where
+   get name = name & getTool <&> eitherToListValidation & Compose
+-- | Parse the tools from the given arglib input, and check that the executables exist
+parseToolsArglib :: Netencode.T -> IO Tools
+parseToolsArglib t = do
+  let oneTool name =
+        NetParse.asText
+          <&> textToString
+          <&> ( \path ->
+                  path
+                    & File.getPermissions
+                    <&> File.executable
+                    <&> ( \case
+                            False -> Left $  [fmt|Tool "{name}" is not an executable|]
+                            True -> Right (Tool path)
+                        )
+              )
+  let allTools =
+        parseTools (\name -> Compose $ NetParse.key name >>> oneTool name)
+          & getCompose
+  t
+    & NetParse.runParse
+      "test"
+      -- TODO: a proper ParseT for netencode values
+      ( NetParse.asRecord
+          >>> NetParse.key "BINS"
+          >>> NetParse.asRecord
+          >>> allTools
+      )
+    & orDo diePanic'
+    & join @IO
+    >>= orDo (\errs -> errs  & diePanic')
+
+-- | Just assume the tools exist by name in the environment.
+parseToolsToolname :: IO Tools
+parseToolsToolname =
+  parseTools
+    ( \name ->
+        checkInPath name <&> \case
+          False -> Left [fmt|"Cannot find "{name}" in PATH|]
+          True -> Right $ Tool (name & textToString)
+    )
+    >>= orDo diePanic'
+
+checkInPath :: Text -> IO Bool
+checkInPath name = do
+  Env.lookupEnv "PATH"
+    <&> annotate "No PATH set"
+    >>= orDo diePanic'
+    <&> stringToText
+    <&> Text.split (== ':')
+    <&> filter (/= "")
+    >>= traverse
+      ( \p ->
+          File.getPermissions ((textToString p) </> (textToString name))
+            <&> File.executable
+            & try @IOError
+            >>= \case
+              Left _ioError -> pure False
+              Right isExe -> pure isExe
+      )
+    <&> or
+
+diePanic' :: ErrorTree -> IO a
+diePanic' errs = errs & prettyErrorTree & diePanic progName
+
+orDo :: Applicative f => (t -> f a) -> Either t a -> f a
+orDo f = \case
+  Left e -> f e
+  Right a -> pure a
+
+
 main :: IO ()
 main =
   secret
@@ -96,6 +194,11 @@ applyFilterRule dat session = do
     (Json.key "data" Json.asArray >> pure ())
     (Json.Object mempty)
 
+data FilterRule = FilterRule
+  { actioncmds :: NonEmpty Json.Object,
+    test :: NonEmpty Json.Object
+  }
+
 data MailfilterList = MailfilterList
   { id_ :: Json.Value,
     rulename :: Text
@@ -120,7 +223,7 @@ applyFilters session = do
       ([] :: [()])
   let goal = Map.fromList [(label @"rulename" "another", 32), (label @"rulename" "xyz", 23)]
   let actions = declarativeUpdate goal filters
-  log [fmt|Would * create: {actions.toCreate & Map.keys & show}, * update: {actions.toUpdate & Map.keys & show}, * delete: {actions.toDelete & Map.keys & show}|]
+  log [fmt|To * create: {actions.toCreate & Map.keys & show}, * update: {actions.toUpdate & Map.keys & show}, * delete: {actions.toDelete & Map.keys & show}|]
   where
     -- filters
     --   & Map.elems
@@ -234,14 +337,13 @@ httpJSON errMsg parser req = do
               | "error" `KeyMap.member` obj
                   && "error_desc" `KeyMap.member` obj -> do
                   printPretty obj
-                  diePanic progName "Server returned above inline error"
+                  diePanic' "Server returned above inline error"
             _ -> pure ()
           val & Json.parseValue parser & \case
             Left errs ->
               errs
                 & parseErrorTree errMsg
-                & prettyErrorTree
-                & diePanic progName
+                & diePanic'
             Right a -> pure a
       )
 
diff --git a/users/Profpatsch/mailbox-org/default.nix b/users/Profpatsch/mailbox-org/default.nix
index 217fd498e5..99b9d45b7d 100644
--- a/users/Profpatsch/mailbox-org/default.nix
+++ b/users/Profpatsch/mailbox-org/default.nix
@@ -2,18 +2,26 @@
 
 let
 
-  cas-serve = depot.users.Profpatsch.writers.writeHaskellInteractive "mailbox-org"
-    {
-      libraries = [
-        depot.users.Profpatsch.my-prelude
-        depot.users.Profpatsch.execline.exec-helpers-hs
-        pkgs.haskellPackages.aeson
-        pkgs.haskellPackages.http-conduit
-        pkgs.haskellPackages.aeson-better-errors
+  cas-serve =
+    lib.pipe ./MailboxOrg.hs [
+      (depot.users.Profpatsch.writers.writeHaskellInteractive "mailbox-org"
+        {
+          libraries = [
+            depot.users.Profpatsch.my-prelude
+            depot.users.Profpatsch.execline.exec-helpers-hs
+            depot.users.Profpatsch.arglib.netencode.haskell
+            pkgs.haskellPackages.aeson
+            pkgs.haskellPackages.http-conduit
+            pkgs.haskellPackages.aeson-better-errors
+
+          ];
+          ghcArgs = [ "-threaded" ];
+        })
+      (depot.users.Profpatsch.arglib.netencode.with-args {
+        BINS = depot.nix.getBins pkgs.dovecot_pigeonhole [ "sieve-test" ];
+      })
+    ];
 
-      ];
-      ghcArgs = [ "-threaded" ];
-    } ./MailboxOrg.hs;
 
 in
 cas-serve
diff --git a/users/Profpatsch/mailbox-org/mailbox-org.cabal b/users/Profpatsch/mailbox-org/mailbox-org.cabal
index 3a1ed91730..66e96608e4 100644
--- a/users/Profpatsch/mailbox-org/mailbox-org.cabal
+++ b/users/Profpatsch/mailbox-org/mailbox-org.cabal
@@ -11,6 +11,16 @@ executable mailbox-org
         base >=4.15 && <5,
         my-prelude,
         exec-helpers,
+        netencode,
+        text,
+        semigroupoids,
+        nonempty-containers,
+        data-fix,
+        selective,
+        directory,
+        mtl,
+        filepath,
+        arglib-netencode,
         random,
         http-conduit,
         http-client,