summaryrefslogtreecommitdiff
path: root/server/Main.hs
diff options
context:
space:
mode:
Diffstat (limited to 'server/Main.hs')
-rw-r--r--server/Main.hs18
1 files changed, 9 insertions, 9 deletions
diff --git a/server/Main.hs b/server/Main.hs
index 6431b3f..d082df7 100644
--- a/server/Main.hs
+++ b/server/Main.hs
@@ -7,12 +7,14 @@
-- | simple server offering linting "as a service"
module Main where
-import Universum
+import Universum hiding (view)
import Control.Concurrent (threadDelay)
import Control.Concurrent.Async (async, link, waitEither_)
import Control.Concurrent.STM.TQueue (TQueue, newTQueueIO,
writeTQueue)
+import Control.Monad.Logger (logInfoN,
+ runStdoutLoggingT)
import qualified Data.Text as T
import Fmt ((+|), (|+))
import Handlers (AdminOverview (AdminOverview),
@@ -20,6 +22,7 @@ import Handlers (AdminOverview (AdminOverv
realtimeImpl, relintImpl,
stateImpl, statusImpl)
import HtmlOrphans ()
+import Lens.Micro.Platform (view)
import Network.HTTP.Client (defaultManagerSettings,
newManager)
import Network.Wai.Handler.Warp (defaultSettings,
@@ -34,6 +37,10 @@ import Servant (Application, Capture,
Server, serve,
type (:<|>) (..),
type (:>))
+import Servant.API (Header)
+import Servant.API.WebSocket (WebSocketPending)
+import Servant.Client (ClientM, client,
+ mkClientEnv, runClientM)
import Servant.HTML.Lucid (HTML)
import Servant.Server.StaticFiles (serveDirectoryWebApp)
import Server (CliOptions (..),
@@ -43,15 +50,8 @@ import Server (CliOptions (..),
exneuland, interval,
loadConfig, orgs, port,
token, verbose)
-import Worker (Job (Job), linterThread)
-
-import Control.Monad.Logger (logInfoN,
- runStdoutLoggingT)
-import Servant.API (Header)
-import Servant.API.WebSocket (WebSocketPending)
-import Servant.Client (ClientM, client,
- mkClientEnv, runClientM)
import WithCli (withCli)
+import Worker (Job (Job), linterThread)
type family PolyEndpoint method format payload where
PolyEndpoint Get format payload =