Skip to content
Snippets Groups Projects
Commit 69e358e5 authored by Ben Gamari's avatar Ben Gamari
Browse files

testsuite/ghc-api: Eliminate Makefile usage from various GHC API tests

These tests can be expressed perfectly well using the testsuite driver
itself.
parent 3b037e97
Branches wip/T17905
No related tags found
No related merge requests found
Pipeline #107210 failed
......@@ -2,29 +2,3 @@ TOP=../..
include $(TOP)/mk/boilerplate.mk
include $(TOP)/mk/test.mk
clean:
rm -f *.o *.hi
T6145:
rm -f T6145.o T6145.hi
'$(TEST_HC)' $(TEST_HC_OPTS) --make -v0 -package ghc T6145
./T6145 "`'$(TEST_HC)' $(TEST_HC_OPTS) --print-libdir | tr -d '\r'`"
T8639_api:
rm -f T8639_api.o T8639_api.hi
'$(TEST_HC)' $(TEST_HC_OPTS) --make -v0 -package ghc T8639_api
./T8639_api "`'$(TEST_HC)' $(TEST_HC_OPTS) --print-libdir | tr -d '\r'`"
T8628:
rm -f T8628.o T8628.hi
'$(TEST_HC)' $(TEST_HC_OPTS) --make -v0 -package ghc -package exceptions T8628
./T8628 "`'$(TEST_HC)' $(TEST_HC_OPTS) --print-libdir | tr -d '\r'`"
T9015:
rm -f T9015.o T9015.hi
'$(TEST_HC)' $(TEST_HC_OPTS) --make -v0 -package ghc T9015
./T9015 "`'$(TEST_HC)' $(TEST_HC_OPTS) --print-libdir | tr -d '\r'`"
.PHONY: clean T6145 T8639_api T8628 T9015
module Main where
import GHC
import GHC.Paths
import Unsafe.Coerce
import Control.Monad.IO.Class
import System.Environment (getArgs)
......
setTestOpts(when(arch('wasm32'), run_timeout_multiplier(2)))
test('ghcApi', normal, compile_and_run, ['-package ghc'])
test('T6145', normal, makefile_test, ['T6145'])
test('T8639_api', req_rts_linker,
makefile_test, ['T8639_api'])
test('T8628', req_rts_linker,
makefile_test, ['T8628'])
test('T9595', [extra_run_opts('"' + config.libdir + '"')],
test('T6145',
[extra_run_opts(f'"{config.libdir}"')],
compile_and_run,
['-package ghc'])
test('T8639_api',
[extra_run_opts(f'"{config.libdir}"'), req_rts_linker],
compile_and_run,
['-package ghc'])
test('T8628',
[extra_run_opts(f'"{config.libdir}"'), req_rts_linker],
compile_and_run,
['-package ghc -package exceptions'])
test('T9015',
[extra_run_opts(f'"{config.libdir}"'), req_rts_linker],
compile_and_run,
['-package ghc'])
test('T9595', [extra_run_opts(f'"{config.libdir}"')],
compile_and_run,
['-package ghc'])
test('T10508_api', [ extra_run_opts('"' + config.libdir + '"'),
......@@ -17,9 +33,6 @@ test('T10508_api', [ extra_run_opts('"' + config.libdir + '"'),
test('T10942', [extra_run_opts('"' + config.libdir + '"')],
compile_and_run,
['-package ghc'])
test('T9015', [extra_run_opts('"' + config.libdir + '"')],
compile_and_run,
['-package ghc'])
test('T11579', [extra_run_opts('"' + config.libdir + '"'), js_skip], compile_and_run,
['-package ghc'])
test('T12099', normal, compile_and_run, ['-package ghc'])
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment