tasty-program-1.0.1: Use tasty framework to test whether a program executes correctly

Safe HaskellNone

Test.Tasty.Program

Description

This module provides a function that tests whether a program can be run successfully. For example if you have 'foo.hs' source file:

 module Foo where

 foo :: Int
 foo = 5

you can test whether GHC can compile it:

 module Main (
   main
  ) where

 import Test.Tasty
 import Test.Tasty.Program

 main :: IO ()
 main = defaultMain $ testGroup "Compilation with GHC" $ [
     testProgram "Foo" "ghc" ["-fforce-recomp", "foo.hs"] Nothing
   ]

Program's output and error streams are ignored.

Synopsis

Documentation

testProgramSource

Arguments

:: TestName

Test name

-> String

Program name

-> [String]

Program options

-> Maybe FilePath

Optional working directory

-> TestTree 

Create test that runs a program with given options. Test succeeds if program terminates successfully.