{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE OverloadedStrings #-}

-- | Haskell code for interacting with a Futhark server program.  This
-- module presents a low-level interface.  See
-- <https://futhark.readthedocs.io/en/latest/server-protocol.html the
-- documentation of the server protocol> for the meaning of the
-- commands.  See also "Futhark.Server.Values" for higher-level
-- functions for loading data into a server.
--
-- Error messages produced by the server will be returned as a
-- 'CmdFailure'.  However, certain errors (such as if the server
-- process terminates unexpectedly, or temporary files cannot be
-- created) will result in an IO exception.
--
-- Many of the functions here are documented only as the server
-- protocol command they correspond to.  See the protocol
-- documentation for details.
module Futhark.Server
  ( -- * Server creation
    Server,
    ServerCfg (..),
    newServerCfg,
    withServer,

    -- * Commands
    CmdFailure (..),
    VarName,
    TypeName,
    EntryName,
    InputType (..),
    OutputType (..),
    cmdRestore,
    cmdStore,
    cmdCall,
    cmdFree,
    cmdRename,
    cmdInputs,
    cmdOutputs,
    cmdClear,
    cmdReport,
    cmdPauseProfiling,
    cmdUnpauseProfiling,
    cmdSetTuningParam,

    -- * Utility
    cmdMaybe,
    cmdEither,

    -- * Raw
    startServer,
    stopServer,
    sendCommand,
  )
where

import Control.Exception
import Control.Monad
import Control.Monad.Except
import Data.Text (Text)
import qualified Data.Text as T
import qualified Data.Text.IO as T
import System.Directory (removeFile)
import System.Exit
import System.IO hiding (stdin, stdout)
import System.IO.Temp (getCanonicalTemporaryDirectory)
import qualified System.Process as P

-- | A handle to a running server.
data Server = Server
  { Server -> Handle
serverStdin :: Handle,
    Server -> Handle
serverStdout :: Handle,
    Server -> FilePath
serverErrLog :: FilePath,
    Server -> ProcessHandle
serverProc :: P.ProcessHandle,
    Server -> Bool
serverDebug :: Bool
  }

-- | Configuration of the server.  Use 'newServerCfg' to conveniently
-- create a sensible default configuration.
data ServerCfg = ServerCfg
  { -- | Path to the server executable.
    ServerCfg -> FilePath
cfgProg :: FilePath,
    -- | Command line options to pass to the
    -- server executable.
    ServerCfg -> [FilePath]
cfgProgOpts :: [String],
    -- | If true, print a running log of server communication to stderr.
    ServerCfg -> Bool
cfgDebug :: Bool
  }
  deriving (ServerCfg -> ServerCfg -> Bool
(ServerCfg -> ServerCfg -> Bool)
-> (ServerCfg -> ServerCfg -> Bool) -> Eq ServerCfg
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ServerCfg -> ServerCfg -> Bool
$c/= :: ServerCfg -> ServerCfg -> Bool
== :: ServerCfg -> ServerCfg -> Bool
$c== :: ServerCfg -> ServerCfg -> Bool
Eq, Eq ServerCfg
Eq ServerCfg
-> (ServerCfg -> ServerCfg -> Ordering)
-> (ServerCfg -> ServerCfg -> Bool)
-> (ServerCfg -> ServerCfg -> Bool)
-> (ServerCfg -> ServerCfg -> Bool)
-> (ServerCfg -> ServerCfg -> Bool)
-> (ServerCfg -> ServerCfg -> ServerCfg)
-> (ServerCfg -> ServerCfg -> ServerCfg)
-> Ord ServerCfg
ServerCfg -> ServerCfg -> Bool
ServerCfg -> ServerCfg -> Ordering
ServerCfg -> ServerCfg -> ServerCfg
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: ServerCfg -> ServerCfg -> ServerCfg
$cmin :: ServerCfg -> ServerCfg -> ServerCfg
max :: ServerCfg -> ServerCfg -> ServerCfg
$cmax :: ServerCfg -> ServerCfg -> ServerCfg
>= :: ServerCfg -> ServerCfg -> Bool
$c>= :: ServerCfg -> ServerCfg -> Bool
> :: ServerCfg -> ServerCfg -> Bool
$c> :: ServerCfg -> ServerCfg -> Bool
<= :: ServerCfg -> ServerCfg -> Bool
$c<= :: ServerCfg -> ServerCfg -> Bool
< :: ServerCfg -> ServerCfg -> Bool
$c< :: ServerCfg -> ServerCfg -> Bool
compare :: ServerCfg -> ServerCfg -> Ordering
$ccompare :: ServerCfg -> ServerCfg -> Ordering
$cp1Ord :: Eq ServerCfg
Ord, Int -> ServerCfg -> ShowS
[ServerCfg] -> ShowS
ServerCfg -> FilePath
(Int -> ServerCfg -> ShowS)
-> (ServerCfg -> FilePath)
-> ([ServerCfg] -> ShowS)
-> Show ServerCfg
forall a.
(Int -> a -> ShowS) -> (a -> FilePath) -> ([a] -> ShowS) -> Show a
showList :: [ServerCfg] -> ShowS
$cshowList :: [ServerCfg] -> ShowS
show :: ServerCfg -> FilePath
$cshow :: ServerCfg -> FilePath
showsPrec :: Int -> ServerCfg -> ShowS
$cshowsPrec :: Int -> ServerCfg -> ShowS
Show)

-- | Create a server config with the given 'cfgProg' and 'cfgProgOpts'.
newServerCfg :: FilePath -> [String] -> ServerCfg
newServerCfg :: FilePath -> [FilePath] -> ServerCfg
newServerCfg FilePath
prog [FilePath]
opts =
  ServerCfg :: FilePath -> [FilePath] -> Bool -> ServerCfg
ServerCfg
    { cfgProg :: FilePath
cfgProg = FilePath
prog,
      cfgProgOpts :: [FilePath]
cfgProgOpts = [FilePath]
opts,
      cfgDebug :: Bool
cfgDebug = Bool
False
    }

-- | Start up a server.  Make sure that 'stopServer' is eventually
-- called on the server.  If this does not happen, then temporary
-- files may be left on the file system.  You almost certainly wish to
-- use 'bracket' or similar to avoid this.  Calls 'error' if startup
-- fails.
startServer :: ServerCfg -> IO Server
startServer :: ServerCfg -> IO Server
startServer (ServerCfg FilePath
prog [FilePath]
options Bool
debug) = do
  FilePath
tmpdir <- IO FilePath
getCanonicalTemporaryDirectory
  (FilePath
err_log_f, Handle
err_log_h) <- FilePath -> FilePath -> IO (FilePath, Handle)
openTempFile FilePath
tmpdir FilePath
"futhark-server-stderr.log"
  (Just Handle
stdin, Just Handle
stdout, Maybe Handle
Nothing, ProcessHandle
phandle) <-
    CreateProcess
-> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
P.createProcess
      ( (FilePath -> [FilePath] -> CreateProcess
P.proc FilePath
prog [FilePath]
options)
          { std_err :: StdStream
P.std_err = Handle -> StdStream
P.UseHandle Handle
err_log_h,
            std_in :: StdStream
P.std_in = StdStream
P.CreatePipe,
            std_out :: StdStream
P.std_out = StdStream
P.CreatePipe
          }
      )

  Maybe ExitCode
code <- ProcessHandle -> IO (Maybe ExitCode)
P.getProcessExitCode ProcessHandle
phandle
  case Maybe ExitCode
code of
    Just (ExitFailure Int
e) ->
      FilePath -> IO Server
forall a. HasCallStack => FilePath -> a
error (FilePath -> IO Server) -> FilePath -> IO Server
forall a b. (a -> b) -> a -> b
$ FilePath
"Cannot start " FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
prog FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
": error " FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ Int -> FilePath
forall a. Show a => a -> FilePath
show Int
e
    Maybe ExitCode
_ -> do
      let server :: Server
server =
            Server :: Handle -> Handle -> FilePath -> ProcessHandle -> Bool -> Server
Server
              { serverStdin :: Handle
serverStdin = Handle
stdin,
                serverStdout :: Handle
serverStdout = Handle
stdout,
                serverProc :: ProcessHandle
serverProc = ProcessHandle
phandle,
                serverDebug :: Bool
serverDebug = Bool
debug,
                serverErrLog :: FilePath
serverErrLog = FilePath
err_log_f
              }
      IO [Text] -> IO ()
forall (f :: * -> *) a. Functor f => f a -> f ()
void (Server -> IO [Text]
responseLines Server
server) IO () -> (IOError -> IO ()) -> IO ()
forall e a. Exception e => IO a -> (e -> IO a) -> IO a
`catch` Server -> IOError -> IO ()
forall a. Server -> IOError -> IO a
onStartupError Server
server
      Server -> IO Server
forall (f :: * -> *) a. Applicative f => a -> f a
pure Server
server
  where
    onStartupError :: Server -> IOError -> IO a
    onStartupError :: Server -> IOError -> IO a
onStartupError Server
s IOError
_ = do
      ExitCode
code <- ProcessHandle -> IO ExitCode
P.waitForProcess (ProcessHandle -> IO ExitCode) -> ProcessHandle -> IO ExitCode
forall a b. (a -> b) -> a -> b
$ Server -> ProcessHandle
serverProc Server
s
      FilePath
stderr_s <- FilePath -> IO FilePath
readFile (FilePath -> IO FilePath) -> FilePath -> IO FilePath
forall a b. (a -> b) -> a -> b
$ Server -> FilePath
serverErrLog Server
s
      FilePath -> IO ()
removeFile (FilePath -> IO ()) -> FilePath -> IO ()
forall a b. (a -> b) -> a -> b
$ Server -> FilePath
serverErrLog Server
s
      FilePath -> IO a
forall a. HasCallStack => FilePath -> a
error (FilePath -> IO a) -> FilePath -> IO a
forall a b. (a -> b) -> a -> b
$
        FilePath
"Command failed with " FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ ExitCode -> FilePath
forall a. Show a => a -> FilePath
show ExitCode
code FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
":\n"
          FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ [FilePath] -> FilePath
unwords (FilePath
prog FilePath -> [FilePath] -> [FilePath]
forall a. a -> [a] -> [a]
: [FilePath]
options)
          FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
"\nStderr:\n"
          FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
stderr_s

-- | Shut down a server.  It may not be used again.  Calls 'error' if
-- the server process terminates with a failing exit code
-- (i.e. anything but 'ExitSuccess').
stopServer :: Server -> IO ()
stopServer :: Server -> IO ()
stopServer Server
s = (IO () -> IO () -> IO ()) -> IO () -> IO () -> IO ()
forall a b c. (a -> b -> c) -> b -> a -> c
flip IO () -> IO () -> IO ()
forall a b. IO a -> IO b -> IO a
finally (FilePath -> IO ()
removeFile (Server -> FilePath
serverErrLog Server
s)) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$ do
  Handle -> IO ()
hClose (Handle -> IO ()) -> Handle -> IO ()
forall a b. (a -> b) -> a -> b
$ Server -> Handle
serverStdin Server
s
  ExitCode
code <- ProcessHandle -> IO ExitCode
P.waitForProcess (ProcessHandle -> IO ExitCode) -> ProcessHandle -> IO ExitCode
forall a b. (a -> b) -> a -> b
$ Server -> ProcessHandle
serverProc Server
s
  case ExitCode
code of
    ExitCode
ExitSuccess -> () -> IO ()
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
    ExitFailure Int
_ -> do
      FilePath
stderr_s <- FilePath -> IO FilePath
readFile (FilePath -> IO FilePath) -> FilePath -> IO FilePath
forall a b. (a -> b) -> a -> b
$ Server -> FilePath
serverErrLog Server
s
      FilePath -> IO ()
forall a. HasCallStack => FilePath -> a
error FilePath
stderr_s

-- | Start a server, execute an action, then shut down the server.
-- The 'Server' may not be returned from the action.
withServer :: ServerCfg -> (Server -> IO a) -> IO a
withServer :: ServerCfg -> (Server -> IO a) -> IO a
withServer ServerCfg
cfg = IO Server -> (Server -> IO ()) -> (Server -> IO a) -> IO a
forall a b c. IO a -> (a -> IO b) -> (a -> IO c) -> IO c
bracket (ServerCfg -> IO Server
startServer ServerCfg
cfg) Server -> IO ()
stopServer

-- Read lines of response until the next %%% OK (which is what
-- indicates that the server is ready for new instructions).
responseLines :: Server -> IO [Text]
responseLines :: Server -> IO [Text]
responseLines Server
s = do
  Text
l <- Handle -> IO Text
T.hGetLine (Handle -> IO Text) -> Handle -> IO Text
forall a b. (a -> b) -> a -> b
$ Server -> Handle
serverStdout Server
s
  Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (Server -> Bool
serverDebug Server
s) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$
    Handle -> Text -> IO ()
T.hPutStrLn Handle
stderr (Text -> IO ()) -> Text -> IO ()
forall a b. (a -> b) -> a -> b
$ Text
"<<< " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
l
  case Text
l of
    Text
"%%% OK" -> [Text] -> IO [Text]
forall (f :: * -> *) a. Applicative f => a -> f a
pure []
    Text
_ -> (Text
l Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
:) ([Text] -> [Text]) -> IO [Text] -> IO [Text]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Server -> IO [Text]
responseLines Server
s

-- | The command failed, and this is why.  The first 'Text' is any
-- output before the failure indincator, and the second Text is the
-- output after the indicator.
data CmdFailure = CmdFailure {CmdFailure -> [Text]
failureLog :: [Text], CmdFailure -> [Text]
failureMsg :: [Text]}
  deriving (CmdFailure -> CmdFailure -> Bool
(CmdFailure -> CmdFailure -> Bool)
-> (CmdFailure -> CmdFailure -> Bool) -> Eq CmdFailure
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CmdFailure -> CmdFailure -> Bool
$c/= :: CmdFailure -> CmdFailure -> Bool
== :: CmdFailure -> CmdFailure -> Bool
$c== :: CmdFailure -> CmdFailure -> Bool
Eq, Eq CmdFailure
Eq CmdFailure
-> (CmdFailure -> CmdFailure -> Ordering)
-> (CmdFailure -> CmdFailure -> Bool)
-> (CmdFailure -> CmdFailure -> Bool)
-> (CmdFailure -> CmdFailure -> Bool)
-> (CmdFailure -> CmdFailure -> Bool)
-> (CmdFailure -> CmdFailure -> CmdFailure)
-> (CmdFailure -> CmdFailure -> CmdFailure)
-> Ord CmdFailure
CmdFailure -> CmdFailure -> Bool
CmdFailure -> CmdFailure -> Ordering
CmdFailure -> CmdFailure -> CmdFailure
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: CmdFailure -> CmdFailure -> CmdFailure
$cmin :: CmdFailure -> CmdFailure -> CmdFailure
max :: CmdFailure -> CmdFailure -> CmdFailure
$cmax :: CmdFailure -> CmdFailure -> CmdFailure
>= :: CmdFailure -> CmdFailure -> Bool
$c>= :: CmdFailure -> CmdFailure -> Bool
> :: CmdFailure -> CmdFailure -> Bool
$c> :: CmdFailure -> CmdFailure -> Bool
<= :: CmdFailure -> CmdFailure -> Bool
$c<= :: CmdFailure -> CmdFailure -> Bool
< :: CmdFailure -> CmdFailure -> Bool
$c< :: CmdFailure -> CmdFailure -> Bool
compare :: CmdFailure -> CmdFailure -> Ordering
$ccompare :: CmdFailure -> CmdFailure -> Ordering
$cp1Ord :: Eq CmdFailure
Ord, Int -> CmdFailure -> ShowS
[CmdFailure] -> ShowS
CmdFailure -> FilePath
(Int -> CmdFailure -> ShowS)
-> (CmdFailure -> FilePath)
-> ([CmdFailure] -> ShowS)
-> Show CmdFailure
forall a.
(Int -> a -> ShowS) -> (a -> FilePath) -> ([a] -> ShowS) -> Show a
showList :: [CmdFailure] -> ShowS
$cshowList :: [CmdFailure] -> ShowS
show :: CmdFailure -> FilePath
$cshow :: CmdFailure -> FilePath
showsPrec :: Int -> CmdFailure -> ShowS
$cshowsPrec :: Int -> CmdFailure -> ShowS
Show)

-- Figure out whether the response is a failure, and if so, return the
-- failure message.
checkForFailure :: [Text] -> Either CmdFailure [Text]
checkForFailure :: [Text] -> Either CmdFailure [Text]
checkForFailure [] = [Text] -> Either CmdFailure [Text]
forall a b. b -> Either a b
Right []
checkForFailure (Text
"%%% FAILURE" : [Text]
ls) = CmdFailure -> Either CmdFailure [Text]
forall a b. a -> Either a b
Left (CmdFailure -> Either CmdFailure [Text])
-> CmdFailure -> Either CmdFailure [Text]
forall a b. (a -> b) -> a -> b
$ [Text] -> [Text] -> CmdFailure
CmdFailure [Text]
forall a. Monoid a => a
mempty [Text]
ls
checkForFailure (Text
l : [Text]
ls) =
  case [Text] -> Either CmdFailure [Text]
checkForFailure [Text]
ls of
    Left (CmdFailure [Text]
xs [Text]
ys) -> CmdFailure -> Either CmdFailure [Text]
forall a b. a -> Either a b
Left (CmdFailure -> Either CmdFailure [Text])
-> CmdFailure -> Either CmdFailure [Text]
forall a b. (a -> b) -> a -> b
$ [Text] -> [Text] -> CmdFailure
CmdFailure (Text
l Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: [Text]
xs) [Text]
ys
    Right [Text]
ls' -> [Text] -> Either CmdFailure [Text]
forall a b. b -> Either a b
Right ([Text] -> Either CmdFailure [Text])
-> [Text] -> Either CmdFailure [Text]
forall a b. (a -> b) -> a -> b
$ Text
l Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: [Text]
ls'

-- Words with spaces in them must be quoted.
quoteWord :: Text -> Text
quoteWord :: Text -> Text
quoteWord Text
t
  | Just Char
_ <- (Char -> Bool) -> Text -> Maybe Char
T.find (Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
== Char
' ') Text
t =
    Text
"\"" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
t Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
"\""
  | Bool
otherwise = Text
t

-- | Send an arbitrary command to the server.  This is only useful
-- when the server protocol has been extended without this module
-- having been similarly extended.  Be careful not to send invalid
-- commands.
sendCommand :: Server -> [Text] -> IO (Either CmdFailure [Text])
sendCommand :: Server -> [Text] -> IO (Either CmdFailure [Text])
sendCommand Server
s [Text]
command = do
  let command' :: Text
command' = [Text] -> Text
T.unwords ([Text] -> Text) -> [Text] -> Text
forall a b. (a -> b) -> a -> b
$ (Text -> Text) -> [Text] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map Text -> Text
quoteWord [Text]
command

  Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (Server -> Bool
serverDebug Server
s) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$
    Handle -> Text -> IO ()
T.hPutStrLn Handle
stderr (Text -> IO ()) -> Text -> IO ()
forall a b. (a -> b) -> a -> b
$ Text
">>> " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
command'

  Handle -> Text -> IO ()
T.hPutStrLn (Server -> Handle
serverStdin Server
s) Text
command'
  Handle -> IO ()
hFlush (Handle -> IO ()) -> Handle -> IO ()
forall a b. (a -> b) -> a -> b
$ Server -> Handle
serverStdin Server
s
  [Text] -> Either CmdFailure [Text]
checkForFailure ([Text] -> Either CmdFailure [Text])
-> IO [Text] -> IO (Either CmdFailure [Text])
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Server -> IO [Text]
responseLines Server
s IO [Text] -> (IOError -> IO [Text]) -> IO [Text]
forall e a. Exception e => IO a -> (e -> IO a) -> IO a
`catch` IOError -> IO [Text]
forall a. IOError -> IO a
onError
  where
    onError :: IOError -> IO a
    onError :: IOError -> IO a
onError IOError
e = do
      Maybe ExitCode
code <- ProcessHandle -> IO (Maybe ExitCode)
P.getProcessExitCode (ProcessHandle -> IO (Maybe ExitCode))
-> ProcessHandle -> IO (Maybe ExitCode)
forall a b. (a -> b) -> a -> b
$ Server -> ProcessHandle
serverProc Server
s
      let code_msg :: FilePath
code_msg =
            case Maybe ExitCode
code of
              Just (ExitFailure Int
x) ->
                FilePath
"\nServer process exited unexpectedly with exit code: " FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ Int -> FilePath
forall a. Show a => a -> FilePath
show Int
x
              Maybe ExitCode
_ -> FilePath
forall a. Monoid a => a
mempty
      FilePath
stderr_s <- FilePath -> IO FilePath
readFile (FilePath -> IO FilePath) -> FilePath -> IO FilePath
forall a b. (a -> b) -> a -> b
$ Server -> FilePath
serverErrLog Server
s
      FilePath -> IO a
forall a. HasCallStack => FilePath -> a
error (FilePath -> IO a) -> FilePath -> IO a
forall a b. (a -> b) -> a -> b
$
        FilePath
"After sending command " FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ [Text] -> FilePath
forall a. Show a => a -> FilePath
show [Text]
command FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
" to server process:"
          FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ IOError -> FilePath
forall a. Show a => a -> FilePath
show IOError
e
          FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
code_msg
          FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
"\nServer stderr:\n"
          FilePath -> ShowS
forall a. [a] -> [a] -> [a]
++ FilePath
stderr_s

-- | The name of a server-side variable.
type VarName = Text

-- | The name of a server-side type.
type TypeName = Text

-- | The name of an entry point.
type EntryName = Text

-- | The type of an input of an entry point.  If 'inputConsumed', then
-- the value passed in a 'cmdCall' must not be used again (nor any of
-- its aliases).
data InputType = InputType
  { InputType -> Bool
inputConsumed :: Bool,
    InputType -> Text
inputType :: TypeName
  }

-- | The type of an output of an entry point.  If 'outputUnique', then
-- the value returned does not alias any of the inputs.  See the
-- Futhark language manual itself for more details - the implications
-- are quite subtle (but you can ignore them unless you manually use
-- type annotations to make some entry point parameters unique).
data OutputType = OutputType
  { OutputType -> Bool
outputUnique :: Bool,
    OutputType -> Text
outputType :: TypeName
  }

inOutType :: (Bool -> TypeName -> a) -> Text -> a
inOutType :: (Bool -> Text -> a) -> Text -> a
inOutType Bool -> Text -> a
f Text
t =
  case Text -> Maybe (Char, Text)
T.uncons Text
t of
    Just (Char
'*', Text
t') -> Bool -> Text -> a
f Bool
True Text
t'
    Maybe (Char, Text)
_ -> Bool -> Text -> a
f Bool
False Text
t

helpCmd :: Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd :: Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd Server
s [Text]
cmd =
  (CmdFailure -> Maybe CmdFailure)
-> ([Text] -> Maybe CmdFailure)
-> Either CmdFailure [Text]
-> Maybe CmdFailure
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either CmdFailure -> Maybe CmdFailure
forall a. a -> Maybe a
Just (Maybe CmdFailure -> [Text] -> Maybe CmdFailure
forall a b. a -> b -> a
const Maybe CmdFailure
forall a. Maybe a
Nothing) (Either CmdFailure [Text] -> Maybe CmdFailure)
-> IO (Either CmdFailure [Text]) -> IO (Maybe CmdFailure)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Server -> [Text] -> IO (Either CmdFailure [Text])
sendCommand Server
s [Text]
cmd

-- | @restore filename var0 type0 var1 type1...@.
cmdRestore :: Server -> FilePath -> [(VarName, TypeName)] -> IO (Maybe CmdFailure)
cmdRestore :: Server -> FilePath -> [(Text, Text)] -> IO (Maybe CmdFailure)
cmdRestore Server
s FilePath
fname [(Text, Text)]
vars = Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd Server
s ([Text] -> IO (Maybe CmdFailure))
-> [Text] -> IO (Maybe CmdFailure)
forall a b. (a -> b) -> a -> b
$ Text
"restore" Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: FilePath -> Text
T.pack FilePath
fname Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: ((Text, Text) -> [Text]) -> [(Text, Text)] -> [Text]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap (Text, Text) -> [Text]
forall a. (a, a) -> [a]
f [(Text, Text)]
vars
  where
    f :: (a, a) -> [a]
f (a
v, a
t) = [a
v, a
t]

-- | @store filename vars...@.
cmdStore :: Server -> FilePath -> [VarName] -> IO (Maybe CmdFailure)
cmdStore :: Server -> FilePath -> [Text] -> IO (Maybe CmdFailure)
cmdStore Server
s FilePath
fname [Text]
vars = Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd Server
s ([Text] -> IO (Maybe CmdFailure))
-> [Text] -> IO (Maybe CmdFailure)
forall a b. (a -> b) -> a -> b
$ Text
"store" Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: FilePath -> Text
T.pack FilePath
fname Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: [Text]
vars

-- | @call entrypoint outs... ins...@.
cmdCall :: Server -> EntryName -> [VarName] -> [VarName] -> IO (Either CmdFailure [T.Text])
cmdCall :: Server -> Text -> [Text] -> [Text] -> IO (Either CmdFailure [Text])
cmdCall Server
s Text
entry [Text]
outs [Text]
ins =
  Server -> [Text] -> IO (Either CmdFailure [Text])
sendCommand Server
s ([Text] -> IO (Either CmdFailure [Text]))
-> [Text] -> IO (Either CmdFailure [Text])
forall a b. (a -> b) -> a -> b
$ Text
"call" Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: Text
entry Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: [Text]
outs [Text] -> [Text] -> [Text]
forall a. [a] -> [a] -> [a]
++ [Text]
ins

-- | @free vars...@.
cmdFree :: Server -> [VarName] -> IO (Maybe CmdFailure)
cmdFree :: Server -> [Text] -> IO (Maybe CmdFailure)
cmdFree Server
s [Text]
vs = Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd Server
s ([Text] -> IO (Maybe CmdFailure))
-> [Text] -> IO (Maybe CmdFailure)
forall a b. (a -> b) -> a -> b
$ Text
"free" Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: [Text]
vs

-- | @rename oldname newname@.
cmdRename :: Server -> VarName -> VarName -> IO (Maybe CmdFailure)
cmdRename :: Server -> Text -> Text -> IO (Maybe CmdFailure)
cmdRename Server
s Text
oldname Text
newname = Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd Server
s [Text
"rename", Text
oldname, Text
newname]

-- | @inputs entryname@, with uniqueness represented as True.
cmdInputs :: Server -> EntryName -> IO (Either CmdFailure [InputType])
cmdInputs :: Server -> Text -> IO (Either CmdFailure [InputType])
cmdInputs Server
s Text
entry =
  ([Text] -> [InputType])
-> Either CmdFailure [Text] -> Either CmdFailure [InputType]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ((Text -> InputType) -> [Text] -> [InputType]
forall a b. (a -> b) -> [a] -> [b]
map ((Bool -> Text -> InputType) -> Text -> InputType
forall a. (Bool -> Text -> a) -> Text -> a
inOutType Bool -> Text -> InputType
InputType)) (Either CmdFailure [Text] -> Either CmdFailure [InputType])
-> IO (Either CmdFailure [Text])
-> IO (Either CmdFailure [InputType])
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Server -> [Text] -> IO (Either CmdFailure [Text])
sendCommand Server
s [Text
"inputs", Text
entry]

-- | @outputs entryname@, with uniqueness represented as True.
cmdOutputs :: Server -> EntryName -> IO (Either CmdFailure [OutputType])
cmdOutputs :: Server -> Text -> IO (Either CmdFailure [OutputType])
cmdOutputs Server
s Text
entry =
  ([Text] -> [OutputType])
-> Either CmdFailure [Text] -> Either CmdFailure [OutputType]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ((Text -> OutputType) -> [Text] -> [OutputType]
forall a b. (a -> b) -> [a] -> [b]
map ((Bool -> Text -> OutputType) -> Text -> OutputType
forall a. (Bool -> Text -> a) -> Text -> a
inOutType Bool -> Text -> OutputType
OutputType)) (Either CmdFailure [Text] -> Either CmdFailure [OutputType])
-> IO (Either CmdFailure [Text])
-> IO (Either CmdFailure [OutputType])
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Server -> [Text] -> IO (Either CmdFailure [Text])
sendCommand Server
s [Text
"outputs", Text
entry]

-- | @clear@
cmdClear :: Server -> IO (Maybe CmdFailure)
cmdClear :: Server -> IO (Maybe CmdFailure)
cmdClear Server
s = Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd Server
s [Text
"clear"]

-- | @report@
cmdReport :: Server -> IO (Either CmdFailure [T.Text])
cmdReport :: Server -> IO (Either CmdFailure [Text])
cmdReport Server
s = Server -> [Text] -> IO (Either CmdFailure [Text])
sendCommand Server
s [Text
"report"]

-- | @pause_profiling@
cmdPauseProfiling :: Server -> IO (Maybe CmdFailure)
cmdPauseProfiling :: Server -> IO (Maybe CmdFailure)
cmdPauseProfiling Server
s = Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd Server
s [Text
"pause_profiling"]

-- | @unpause_profiling@
cmdUnpauseProfiling :: Server -> IO (Maybe CmdFailure)
cmdUnpauseProfiling :: Server -> IO (Maybe CmdFailure)
cmdUnpauseProfiling Server
s = Server -> [Text] -> IO (Maybe CmdFailure)
helpCmd Server
s [Text
"unpause_profiling"]

-- | @set_tuning_param param value@
cmdSetTuningParam :: Server -> Text -> Text -> IO (Either CmdFailure [T.Text])
cmdSetTuningParam :: Server -> Text -> Text -> IO (Either CmdFailure [Text])
cmdSetTuningParam Server
s Text
param Text
value = Server -> [Text] -> IO (Either CmdFailure [Text])
sendCommand Server
s [Text
"set_tuning_param", Text
param, Text
value]

-- | Turn a 'Maybe'-producing command into a monadic action.
cmdMaybe :: (MonadError T.Text m, MonadIO m) => IO (Maybe CmdFailure) -> m ()
cmdMaybe :: IO (Maybe CmdFailure) -> m ()
cmdMaybe = m () -> (CmdFailure -> m ()) -> Maybe CmdFailure -> m ()
forall b a. b -> (a -> b) -> Maybe a -> b
maybe (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()) (Text -> m ()
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (Text -> m ()) -> (CmdFailure -> Text) -> CmdFailure -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [Text] -> Text
T.unlines ([Text] -> Text) -> (CmdFailure -> [Text]) -> CmdFailure -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CmdFailure -> [Text]
failureMsg) (Maybe CmdFailure -> m ())
-> (IO (Maybe CmdFailure) -> m (Maybe CmdFailure))
-> IO (Maybe CmdFailure)
-> m ()
forall (m :: * -> *) b c a.
Monad m =>
(b -> m c) -> (a -> m b) -> a -> m c
<=< IO (Maybe CmdFailure) -> m (Maybe CmdFailure)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO

-- | Turn an 'Either'-producing command into a monadic action.
cmdEither :: (MonadError T.Text m, MonadIO m) => IO (Either CmdFailure a) -> m a
cmdEither :: IO (Either CmdFailure a) -> m a
cmdEither = (CmdFailure -> m a) -> (a -> m a) -> Either CmdFailure a -> m a
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either (Text -> m a
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (Text -> m a) -> (CmdFailure -> Text) -> CmdFailure -> m a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [Text] -> Text
T.unlines ([Text] -> Text) -> (CmdFailure -> [Text]) -> CmdFailure -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CmdFailure -> [Text]
failureMsg) a -> m a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Either CmdFailure a -> m a)
-> (IO (Either CmdFailure a) -> m (Either CmdFailure a))
-> IO (Either CmdFailure a)
-> m a
forall (m :: * -> *) b c a.
Monad m =>
(b -> m c) -> (a -> m b) -> a -> m c
<=< IO (Either CmdFailure a) -> m (Either CmdFailure a)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO