Skip to content
Snippets Groups Projects

Enable testing of Word64# on 32-bit platforms

Merged Ben Gamari requested to merge word64 into master
Files
17
+ 5
7
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TypeApplications #-}
-- | Cmm pipeline correctness testsuite.
module Main
( module Main
@@ -21,7 +26,6 @@ import Interpreter
import MulMayOverflow
import Number
import RunGhc
import ToCmm
import Width
newtype UsedEvalMethod = UsedEvalMethod EvalMethod
@@ -66,12 +70,6 @@ instance IsOption Emulator where
optionCLParser =
Emulator . Just <$> option str (long "emulator" <> help "Path to emulator executable")
basicCompiler :: FilePath -> Compiler
basicCompiler ghcPath =
Compiler { compPath = ghcPath
, compArgs = ["-dcmm-lint", "-dasm-lint", "-O0"]
}
-- * Properties
expr_prop :: EvalMethod -> Expr WordSize -> Property
Loading