aboutsummaryrefslogtreecommitdiff
path: root/hsm-dummy-fail/Main.hs
diff options
context:
space:
mode:
Diffstat (limited to 'hsm-dummy-fail/Main.hs')
-rw-r--r--hsm-dummy-fail/Main.hs47
1 files changed, 47 insertions, 0 deletions
diff --git a/hsm-dummy-fail/Main.hs b/hsm-dummy-fail/Main.hs
new file mode 100644
index 0000000..4e293c8
--- /dev/null
+++ b/hsm-dummy-fail/Main.hs
@@ -0,0 +1,47 @@
+{-# LANGUAGE OverloadedRecordDot #-}
+{-# LANGUAGE OverloadedStrings #-}
+{-# LANGUAGE TemplateHaskell #-}
+
+import Data.Function ((&))
+import Data.Text (Text)
+import Effectful (Eff, (:>), runEff)
+import Effectful.Concurrent (Concurrent, runConcurrent, threadDelay)
+import Effectful.Log (runLog)
+import Effectful.Reader.Static (Reader, asks, runReader)
+import Effectful.Resource (runResource)
+import Hsm.Core.App (launch)
+import Hsm.Core.Env (deriveFromYaml)
+import Hsm.Core.Zmq.Server (runServer, send)
+import Hsm.Status.Error (Error(Error))
+import Streamly.Data.Stream (Stream, fromEffect)
+import System.IO.Echo (withoutInputEcho)
+
+data Env = Env
+ { name :: Text
+ , pubEp :: Text
+ , alive :: Int
+ }
+
+$(deriveFromYaml ''Env)
+
+singleError :: (Concurrent :> es, Reader Env :> es) => Stream (Eff es) Error
+singleError =
+ fromEffect $ do
+ -- Seemingly, the service needs to be alive for a bit for ZMQ comms to
+ -- kick in.
+ asks alive >>= threadDelay
+ return $ Error 0 "Sent from dummy-fail service"
+
+-- Dummy fail service:
+-- Proof of concept. Publishes a single error that can be catched by a
+-- listening client.
+main :: IO ()
+main =
+ launch @Env "dummy-fail" withoutInputEcho $ \env logger level ->
+ (singleError & send @Env)
+ & runServer @Env
+ & runConcurrent
+ & runLog env.name logger level
+ & runReader env
+ & runResource
+ & runEff