Skip to content

Commit

Permalink
Merge pull request #557 from input-output-hk/jhbertra/marlowe-rename
Browse files Browse the repository at this point in the history
Renaming
  • Loading branch information
jhbertra authored Apr 4, 2023
2 parents 7db3e6d + 9b90de9 commit 8cbf483
Show file tree
Hide file tree
Showing 25 changed files with 109 additions and 109 deletions.
2 changes: 1 addition & 1 deletion RELEASE.md
Original file line number Diff line number Diff line change
Expand Up @@ -103,7 +103,7 @@ Create a new release on GitHub that points to the release tag. Include a
high-level summary description and a detailed change log (from the main
changelog).

Attach the binary files for the CLI tools (`marlowe-cli` and `marlowe`) to the
Attach the binary files for the CLI tools (`marlowe-cli` and `marlowe-runtime-cli`) to the
release for Mac and Linux.

## Step 8: Update documentation
Expand Down
5 changes: 3 additions & 2 deletions dev-shell.nix
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
, packages
}:
let
inherit (packages) pkgs marlowe docs marlowe-cli dev-scripts network;
inherit (packages) pkgs marlowe docs dev-scripts network;
inherit (dev-scripts) nix-flakes-alias start-cardano-node mkCabalExeScript;
inherit (pkgs) stdenv lib utillinux python3 nixpkgs-fmt writeShellScriptBin networks;
inherit (marlowe) haskell cabal-install stylish-haskell sphinxcontrib-haddock sphinx-markdown-tables sphinxemoji nix-pre-commit-hooks cardano-address;
Expand All @@ -15,7 +15,8 @@ let
mkdir -p "''${XDG_RUNTIME_DIR}"
'';

marlowe-runtime-cli = mkCabalExeScript "marlowe" "marlowe-runtime-cli";
marlowe-runtime-cli = mkCabalExeScript "marlowe-runtime-cli" "marlowe-runtime-cli";
marlowe-cli = mkCabalExeScript "marlowe-cli" "marlowe-cli";

# For Sphinx, and ad-hoc usage
sphinxTools = python3.withPackages (ps: [
Expand Down
4 changes: 2 additions & 2 deletions flake.nix
Original file line number Diff line number Diff line change
Expand Up @@ -132,9 +132,9 @@
program = "${packages.marlowe-web-server}/bin/marlowe-web-server";
};

marlowe = {
marlowe-runtime-cli = {
type = "app";
program = "${packages.marlowe-rt}/bin/marlowe";
program = "${packages.marlowe-runtime-cli}/bin/marlowe-runtime-cli";
};

marlowe-integration-tests = {
Expand Down
4 changes: 2 additions & 2 deletions marlowe-apps/src/Language/Marlowe/Runtime/App/Types.hs
Original file line number Diff line number Diff line change
Expand Up @@ -88,7 +88,7 @@ import qualified Data.Aeson.Types as A
import Data.Foldable (fold)
import qualified Data.Map.Strict as M (Map, map, mapKeys)
import qualified Data.Text as T (Text)
import Language.Marlowe.Protocol.Client (hoistMarloweClient)
import Language.Marlowe.Protocol.Client (hoistMarloweRuntimeClient)
import Language.Marlowe.Protocol.Query.Types (ContractFilter)
import qualified Language.Marlowe.Runtime.ChainSync.Api as CS (Transaction)

Expand Down Expand Up @@ -157,7 +157,7 @@ instance MonadWith Client where
restore' = Client . restore . runClient

instance MonadMarlowe Client where
runMarloweClient client = Client $ runMarloweClient $ hoistMarloweClient runClient client
runMarloweRuntimeClient client = Client $ runMarloweRuntimeClient $ hoistMarloweRuntimeClient runClient client


-- | A function signature for running a client for some protocol in some monad m.
Expand Down
2 changes: 1 addition & 1 deletion marlowe-cli/flake.nix
Original file line number Diff line number Diff line change
Expand Up @@ -35,7 +35,7 @@
];
extraPackages = p: [
local.marlowe-cli
local.marlowe-rt
local.marlowe-runtime-cli
# local.pkgs.cardano.packages.cardano-address
# local.pkgs.cardano.packages.cardano-node
local.pkgs.cardano.packages.cardano-cli
Expand Down
6 changes: 3 additions & 3 deletions marlowe-client/src/Control/Monad/Trans/Marlowe.hs
Original file line number Diff line number Diff line change
Expand Up @@ -25,11 +25,11 @@ import Control.Monad.Trans.Resource (MonadResource)
import Control.Monad.With (MonadWith(..))
import Control.Monad.Writer (MonadWriter)
import Data.GeneralAllocate (GeneralAllocate(..), GeneralAllocated(..))
import Language.Marlowe.Protocol.Client (MarloweClient)
import Language.Marlowe.Protocol.Client (MarloweRuntimeClient)
import Network.Protocol.Connection (SomeClientConnector)
import UnliftIO (MonadUnliftIO)

newtype MarloweT m a = MarloweT { unMarloweT :: ReaderT (SomeClientConnector MarloweClient IO) m a }
newtype MarloweT m a = MarloweT { unMarloweT :: ReaderT (SomeClientConnector MarloweRuntimeClient IO) m a }
deriving newtype
( Functor
, Applicative
Expand Down Expand Up @@ -84,5 +84,5 @@ instance MonadReader r m => MonadReader r (MarloweT m) where
mapMarloweT :: (m a -> n b) -> MarloweT m a -> MarloweT n b
mapMarloweT f = MarloweT . mapReaderT f . unMarloweT

runMarloweT :: MarloweT m a -> SomeClientConnector MarloweClient IO -> m a
runMarloweT :: MarloweT m a -> SomeClientConnector MarloweRuntimeClient IO -> m a
runMarloweT = runReaderT . unMarloweT
26 changes: 13 additions & 13 deletions marlowe-client/src/Control/Monad/Trans/Marlowe/Class.hs
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ import Control.Monad.Trans.Reader (ReaderT(..))
import Control.Monad.Trans.Resource.Internal (ResourceT(..))
import Data.Coerce (coerce)
import Data.Time (UTCTime)
import Language.Marlowe.Protocol.Client (MarloweClient(..), hoistMarloweClient)
import Language.Marlowe.Protocol.Client (MarloweRuntimeClient(..), hoistMarloweRuntimeClient)
import Language.Marlowe.Protocol.HeaderSync.Client (MarloweHeaderSyncClient)
import Language.Marlowe.Protocol.Query.Client (MarloweQueryClient)
import Language.Marlowe.Protocol.Sync.Client (MarloweSyncClient)
Expand Down Expand Up @@ -38,40 +38,40 @@ import UnliftIO (MonadIO, MonadUnliftIO, liftIO, newIORef, readIORef, withRunInI
-- Runtime instance.
class Monad m => MonadMarlowe m where
-- ^ Run a client of the Marlowe protocol.
runMarloweClient :: MarloweClient m a -> m a
runMarloweRuntimeClient :: MarloweRuntimeClient m a -> m a

instance MonadUnliftIO m => MonadMarlowe (MarloweT m) where
runMarloweClient client = MarloweT $ ReaderT \connector -> withRunInIO \runInIO ->
runSomeConnector connector $ hoistMarloweClient (runInIO . flip runMarloweT connector) client
runMarloweRuntimeClient client = MarloweT $ ReaderT \connector -> withRunInIO \runInIO ->
runSomeConnector connector $ hoistMarloweRuntimeClient (runInIO . flip runMarloweT connector) client

instance MonadMarlowe m => MonadMarlowe (ReaderT r m) where
runMarloweClient client = ReaderT \r ->
runMarloweClient $ hoistMarloweClient (flip runReaderT r) client
runMarloweRuntimeClient client = ReaderT \r ->
runMarloweRuntimeClient $ hoistMarloweRuntimeClient (flip runReaderT r) client

instance MonadMarlowe m => MonadMarlowe (ResourceT m) where
runMarloweClient client = ResourceT \rm ->
runMarloweClient $ hoistMarloweClient (flip unResourceT rm) client
runMarloweRuntimeClient client = ResourceT \rm ->
runMarloweRuntimeClient $ hoistMarloweRuntimeClient (flip unResourceT rm) client

instance MonadMarlowe m => MonadMarlowe (IdentityT m) where
runMarloweClient = coerce runMarloweClient
runMarloweRuntimeClient = coerce runMarloweRuntimeClient

-- ^ Run a MarloweSyncClient. Used to synchronize with history for a specific
-- contract.
runMarloweSyncClient :: MonadMarlowe m => MarloweSyncClient m a -> m a
runMarloweSyncClient = runMarloweClient . RunMarloweSyncClient
runMarloweSyncClient = runMarloweRuntimeClient . RunMarloweSyncClient

-- ^ Run a MarloweHeaderSyncClient. Used to synchronize with contract creation
-- transactions.
runMarloweHeaderSyncClient :: MonadMarlowe m => MarloweHeaderSyncClient m a -> m a
runMarloweHeaderSyncClient = runMarloweClient . RunMarloweHeaderSyncClient
runMarloweHeaderSyncClient = runMarloweRuntimeClient . RunMarloweHeaderSyncClient

-- ^ Run a MarloweQueryClient.
runMarloweQueryClient :: MonadMarlowe m => MarloweQueryClient m a -> m a
runMarloweQueryClient = runMarloweClient . RunMarloweQueryClient
runMarloweQueryClient = runMarloweRuntimeClient . RunMarloweQueryClient

-- ^ Run a MarloweTxCommand job client.
runMarloweTxClient :: MonadMarlowe m => JobClient MarloweTxCommand m a -> m a
runMarloweTxClient = runMarloweClient . RunTxClient
runMarloweTxClient = runMarloweRuntimeClient . RunTxClient

-- ^ Create a new contract.
createContract
Expand Down
4 changes: 2 additions & 2 deletions marlowe-client/src/Language/Marlowe/Runtime/Client.hs
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@ module Language.Marlowe.Runtime.Client

import Control.Monad.Trans.Marlowe
import Control.Monad.Trans.Marlowe.Class
import Language.Marlowe.Protocol.Client (marloweClientPeer)
import Language.Marlowe.Protocol.Client (marloweRuntimeClientPeer)
import Network.Protocol.Connection (SomeConnector(..))
import Network.Protocol.Driver (tcpClient)
import Network.Protocol.Handshake.Client (handshakeClientConnector)
Expand All @@ -16,4 +16,4 @@ connectToMarloweRuntime :: HostName -> PortNumber -> MarloweT m a -> m a
connectToMarloweRuntime host port action = runMarloweT action
$ SomeConnector
$ handshakeClientConnector
$ tcpClient host port marloweClientPeer
$ tcpClient host port marloweRuntimeClientPeer
Original file line number Diff line number Diff line change
Expand Up @@ -636,10 +636,10 @@ prepareCliArgs args = do
pure $ ["--marlowe-runtime-port", show proxyPort] <> args

execMarlowe :: [String] -> Integration String
execMarlowe = exec "marlowe" <=< prepareCliArgs
execMarlowe = exec "marlowe-runtime-cli" <=< prepareCliArgs

execMarlowe_ :: [String] -> Integration ()
execMarlowe_ = void . execMarlowe

execMarlowe' :: [String] -> Integration (ExitCode, String, String)
execMarlowe' = exec' "marlowe" <=< prepareCliArgs
execMarlowe' = exec' "marlowe-runtime-cli" <=< prepareCliArgs
28 changes: 14 additions & 14 deletions marlowe-integration/src/Test/Integration/Marlowe/Local.hs
Original file line number Diff line number Diff line change
Expand Up @@ -88,18 +88,18 @@ import Language.Marlowe.CLI.Types
, ValidatorInfo(..)
, defaultCoinSelectionStrategy
)
import Language.Marlowe.Protocol.Client (MarloweClient, hoistMarloweClient, marloweClientPeer)
import Language.Marlowe.Protocol.Client (MarloweRuntimeClient, hoistMarloweRuntimeClient, marloweRuntimeClientPeer)
import Language.Marlowe.Protocol.HeaderSync.Client (MarloweHeaderSyncClient, marloweHeaderSyncClientPeer)
import Language.Marlowe.Protocol.HeaderSync.Server (MarloweHeaderSyncServer, marloweHeaderSyncServerPeer)
import Language.Marlowe.Protocol.HeaderSync.Types (MarloweHeaderSync)
import Language.Marlowe.Protocol.Query.Client (MarloweQueryClient(..), marloweQueryClientPeer)
import Language.Marlowe.Protocol.Query.Server (MarloweQueryServer)
import Language.Marlowe.Protocol.Query.Types (MarloweQuery)
import Language.Marlowe.Protocol.Server (MarloweServer, marloweServerPeer)
import Language.Marlowe.Protocol.Server (MarloweRuntimeServer, marloweRuntimeServerPeer)
import Language.Marlowe.Protocol.Sync.Client (MarloweSyncClient, marloweSyncClientPeer)
import Language.Marlowe.Protocol.Sync.Server (MarloweSyncServer, marloweSyncServerPeer)
import Language.Marlowe.Protocol.Sync.Types (MarloweSync)
import Language.Marlowe.Protocol.Types (Marlowe)
import qualified Language.Marlowe.Protocol.Types as Protocol
import Language.Marlowe.Runtime.Cardano.Api (fromCardanoAddressInEra, fromCardanoLovelace, fromCardanoTxId)
import Language.Marlowe.Runtime.ChainIndexer
(ChainIndexerDependencies(..), ChainIndexerSelector, chainIndexer, getChainIndexerSelectorConfig)
Expand Down Expand Up @@ -180,7 +180,7 @@ import Text.Read (readMaybe)
import UnliftIO (MonadUnliftIO, withRunInIO)

data MarloweRuntime = MarloweRuntime
{ protocolConnector :: SomeClientConnector MarloweClient IO
{ protocolConnector :: SomeClientConnector MarloweRuntimeClient IO
, proxyPort :: Int
, runWebClient :: forall a. ClientM a -> IO (Either ClientError a)
, marloweScripts :: MarloweScripts
Expand Down Expand Up @@ -299,7 +299,7 @@ withLocalMarloweRuntime' MarloweRuntimeOptions{..} test = withRunInIO \runInIO -
else liftIO $ threadDelay 1000 *> waitForWebServer (counter + 1)
| otherwise = fail "Unable to connect to web server"

let protocolConnector = SomeConnector $ ihoistConnector hoistMarloweClient (runResourceT . runWrappedUnliftIO) liftIO $ clientConnector marlowePair
let protocolConnector = SomeConnector $ ihoistConnector hoistMarloweRuntimeClient (runResourceT . runWrappedUnliftIO) liftIO $ clientConnector marlowePair

-- Persist the genesis block before starting the services so that they
-- exist already and no database queries fail.
Expand Down Expand Up @@ -451,9 +451,9 @@ data RuntimeSelector f where
HeaderSyncPair :: ClientServerPairSelector (Handshake MarloweHeaderSync) f -> RuntimeSelector f
MarloweSyncPair :: ClientServerPairSelector (Handshake MarloweSync) f -> RuntimeSelector f
MarloweQueryPair :: ClientServerPairSelector (Handshake MarloweQuery) f -> RuntimeSelector f
MarlowePair :: ClientServerPairSelector (Handshake Marlowe) f -> RuntimeSelector f
MarlowePair :: ClientServerPairSelector (Handshake Protocol.MarloweRuntime) f -> RuntimeSelector f
TxJobPair :: ClientServerPairSelector (Handshake (Job MarloweTxCommand)) f -> RuntimeSelector f
MarloweTCP :: ConnectorSelector (Handshake Marlowe) f -> RuntimeSelector f
MarloweTCP :: ConnectorSelector (Handshake Protocol.MarloweRuntime) f -> RuntimeSelector f
TxEvent :: TransactionServerSelector f -> RuntimeSelector f
ChainIndexerEvent :: ChainIndexerSelector f -> RuntimeSelector f
MarloweIndexerEvent :: MarloweIndexerSelector f -> RuntimeSelector f
Expand All @@ -466,7 +466,7 @@ data RuntimeDependencies r = RuntimeDependencies
, chainSyncQueryPair :: ClientServerPair (Handshake (Query ChainSyncQuery)) (QueryServer ChainSyncQuery) (QueryClient ChainSyncQuery) IO
, marloweHeaderSyncPair :: ClientServerPair (Handshake MarloweHeaderSync) MarloweHeaderSyncServer MarloweHeaderSyncClient IO
, marloweSyncPair :: ClientServerPair (Handshake MarloweSync) MarloweSyncServer MarloweSyncClient IO
, marlowePair :: ClientServerPair (Handshake Marlowe) MarloweServer MarloweClient ServerM
, marlowePair :: ClientServerPair (Handshake Protocol.MarloweRuntime) MarloweRuntimeServer MarloweRuntimeClient ServerM
, marloweQueryPair :: ClientServerPair (Handshake MarloweQuery) MarloweQueryServer MarloweQueryClient IO
, txJobPair :: ClientServerPair (Handshake (Job MarloweTxCommand)) (JobServer MarloweTxCommand) (JobClient MarloweTxCommand) IO
, chainIndexerDatabaseQueries :: ChainIndexer.DatabaseQueries IO
Expand Down Expand Up @@ -494,7 +494,7 @@ runtime = proc RuntimeDependencies{..} -> do

LocalNodeConnectInfo{..} = localNodeConnectInfo

marloweServerSource <- handshakeConnectionSource <$> tcpServer -< TcpServerDependencies "127.0.0.1" (fromIntegral proxyPort) marloweServerPeer
marloweRuntimeServerSource <- handshakeConnectionSource <$> tcpServer -< TcpServerDependencies "127.0.0.1" (fromIntegral proxyPort) marloweRuntimeServerPeer

chainIndexer -<
let
Expand Down Expand Up @@ -583,15 +583,15 @@ runtime = proc RuntimeDependencies{..} -> do
, getMarloweHeaderSyncDriver = driverFactory $ clientConnector marloweHeaderSyncPair
, getMarloweQueryDriver = driverFactory $ clientConnector marloweQueryPair
, getTxJobDriver = driverFactory $ clientConnector txJobPair
, connectionSource = SomeConnectionSource (logConnectionSource (narrowEventBackend (injectSelector MarloweTCP) $ hoistEventBackend liftIO rootEventBackend) marloweServerSource <> Connection.connectionSource marlowePair)
, connectionSource = SomeConnectionSource (logConnectionSource (narrowEventBackend (injectSelector MarloweTCP) $ hoistEventBackend liftIO rootEventBackend) marloweRuntimeServerSource <> Connection.connectionSource marlowePair)
, httpPort = webPort + 6
}

server -< ServerDependencies
{ openAPIEnabled = False
, accessControlAllowOriginAll = False
, runApplication = run webPort
, connector = SomeConnector $ ihoistConnector hoistMarloweClient (runResourceT . runWrappedUnliftIO) liftIO $ clientConnector marlowePair
, connector = SomeConnector $ ihoistConnector hoistMarloweRuntimeClient (runResourceT . runWrappedUnliftIO) liftIO $ clientConnector marlowePair
, eventBackend = noopEventBackend ()
}

Expand All @@ -608,7 +608,7 @@ data Channels = Channels
, marloweSyncPair :: ClientServerPair (Handshake MarloweSync) MarloweSyncServer MarloweSyncClient IO
, marloweQueryPair :: ClientServerPair (Handshake MarloweQuery) MarloweQueryServer MarloweQueryClient IO
, txJobPair :: ClientServerPair (Handshake (Job MarloweTxCommand)) (JobServer MarloweTxCommand) (JobClient MarloweTxCommand) IO
, marlowePair :: ClientServerPair (Handshake Marlowe) MarloweServer MarloweClient ServerM
, marlowePair :: ClientServerPair (Handshake Protocol.MarloweRuntime) MarloweRuntimeServer MarloweRuntimeClient ServerM
}

setupChannels :: EventBackend IO r RuntimeSelector -> STM Channels
Expand All @@ -635,8 +635,8 @@ setupChannels eventBackend = do
jobServerPeer
jobClientPeer
marlowePair <- logClientServerPair (hoistEventBackend liftIO $ narrowEventBackend (injectSelector MarlowePair) eventBackend) . handshakeClientServerPair <$> clientServerPair
marloweServerPeer
marloweClientPeer
marloweRuntimeServerPeer
marloweRuntimeClientPeer
pure Channels{..}

getRuntimeSelectorConfig :: RuntimeSelector f -> SelectorConfig f
Expand Down
4 changes: 2 additions & 2 deletions marlowe-runtime-cli/app/Language/Marlowe/Runtime/CLI/Monad.hs
Original file line number Diff line number Diff line change
Expand Up @@ -13,7 +13,7 @@ import Control.Monad.Trans.Except (ExceptT, runExceptT)
import Control.Monad.Trans.Marlowe (MarloweT)
import Control.Monad.Trans.Marlowe.Class (MonadMarlowe(..))
import Control.Monad.Trans.Reader (ReaderT)
import Language.Marlowe.Protocol.Client (hoistMarloweClient)
import Language.Marlowe.Protocol.Client (hoistMarloweRuntimeClient)
import Language.Marlowe.Runtime.CLI.Env (Env(..))
import Options.Applicative (Alternative)
import System.Exit (die)
Expand All @@ -34,7 +34,7 @@ newtype CLI a = CLI { runCLI :: MarloweT (ReaderT Env IO) a }
)

instance MonadMarlowe CLI where
runMarloweClient client = CLI $ runMarloweClient $ hoistMarloweClient runCLI client
runMarloweRuntimeClient client = CLI $ runMarloweRuntimeClient $ hoistMarloweRuntimeClient runCLI client

-- | Get the environment.
askEnv :: CLI Env
Expand Down
2 changes: 1 addition & 1 deletion marlowe-runtime-cli/marlowe-runtime-cli.cabal
Original file line number Diff line number Diff line change
Expand Up @@ -47,7 +47,7 @@ common lang
-Wincomplete-uni-patterns -Wincomplete-record-updates
-Wredundant-constraints -Widentities

executable marlowe
executable marlowe-runtime-cli
import: lang
hs-source-dirs: app
main-is: Main.hs
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -27,7 +27,7 @@ import Control.Concurrent.Component
import Control.Monad.IO.Unlift (withRunInIO)
import Control.Monad.Reader (runReaderT)
import Data.Void (Void)
import Language.Marlowe.Protocol.Client (MarloweClient)
import Language.Marlowe.Protocol.Client (MarloweRuntimeClient)
import qualified Language.Marlowe.Runtime.Web as Web
import Language.Marlowe.Runtime.Web.Server.Monad (AppEnv(..), AppM(..))
import qualified Language.Marlowe.Runtime.Web.Server.OpenAPI as OpenAPI
Expand Down Expand Up @@ -108,7 +108,7 @@ data ServerDependencies r = ServerDependencies
{ openAPIEnabled :: Bool
, accessControlAllowOriginAll :: Bool
, runApplication :: Application -> IO ()
, connector :: SomeClientConnector MarloweClient IO
, connector :: SomeClientConnector MarloweRuntimeClient IO
, eventBackend :: EventBackend IO r ServerSelector
}

Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -12,7 +12,7 @@ import Control.Error (note)
import Control.Monad (guard, mfilter)
import Control.Monad.IO.Class (liftIO)
import Data.List (uncons)
import Language.Marlowe.Protocol.Client (MarloweClient(..))
import Language.Marlowe.Protocol.Client (MarloweRuntimeClient(..))
import Language.Marlowe.Protocol.Query.Client
(getContractHeaders, getContractState, getTransaction, getTransactions, getWithdrawal, getWithdrawals)
import Language.Marlowe.Protocol.Query.Types
Expand All @@ -29,7 +29,7 @@ import Network.Protocol.Driver (runSomeConnector)
import Servant.Pagination

data SyncClientDependencies = SyncClientDependencies
{ connector :: SomeClientConnector MarloweClient IO
{ connector :: SomeClientConnector MarloweRuntimeClient IO
, lookupTempContract :: ContractId -> STM (Maybe (TempTx ContractCreated))
, lookupTempTransaction :: ContractId -> TxId -> STM (Maybe (TempTx InputsApplied))
, lookupTempWithdrawal :: TxId -> STM (Maybe (TempTx Withdrawn))
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -32,7 +32,7 @@ import Data.Foldable (for_)
import qualified Data.Map as Map
import Data.Time (UTCTime)
import Data.Void (Void)
import Language.Marlowe.Protocol.Client (MarloweClient(..))
import Language.Marlowe.Protocol.Client (MarloweRuntimeClient(..))
import Language.Marlowe.Runtime.Cardano.Api (fromCardanoTxId)
import Language.Marlowe.Runtime.ChainSync.Api (Lovelace, StakeCredential, TokenName, TxId)
import Language.Marlowe.Runtime.Core.Api
Expand Down Expand Up @@ -65,7 +65,7 @@ compile $ SelectorSpec ["tx", "client"]
]

newtype TxClientDependencies r = TxClientDependencies
{ connector :: SomeClientConnector MarloweClient IO
{ connector :: SomeClientConnector MarloweRuntimeClient IO
}

type CreateContract m
Expand Down
Loading

0 comments on commit 8cbf483

Please sign in to comment.