Skip to content
Snippets Groups Projects
Commit 22535fa3 authored by Ian Lynagh's avatar Ian Lynagh
Browse files

Update tests now -fglasgow-exts is deprecated

parent 811690f9
No related branches found
No related tags found
No related merge requests found
Showing
with 23 additions and 19 deletions
{-# OPTIONS -fglasgow-exts #-}
module Bug (tst) where
tst :: Float -> Bool
tst x = truncate x > (0::Int)
{-# OPTIONS -fglasgow-exts #-}
{-# LANGUAGE MagicHash #-}
module ShouldCompile where
......
{-# OPTIONS_GHC -cpp -fglasgow-exts #-}
{-# LANGUAGE MagicHash #-}
module ShouldCompile where
-- exposed a bug in the NCG in 6.4.2
......
......@@ -53,7 +53,7 @@ test('ds045', normal, compile, [''])
test('ds046', normal, compile, ['-funbox-strict-fields'])
test('ds047', normal, compile, [''])
test('ds048', normal, compile, [''])
test('ds050', normal, compile, ['-fglasgow-exts'])
test('ds050', normal, compile, [''])
test('ds051', normal, compile, [''])
test('ds052', normal, compile, [''])
test('ds053', normal, compile, [''])
......
{-# OPTIONS -fglasgow-exts #-}
{-# LANGUAGE MagicHash #-}
module ShouldCompile where
import GHC.Exts
......
{-# LANGUAGE Rank2Types #-}
module ShouldCompile where
data Q = Q {f :: forall a. a -> a}
......
{-# OPTIONS -fglasgow-exts #-}
{-# LANGUAGE ExistentialQuantification, DeriveDataTypeable #-}
-- This module requires quite trick desugaring,
-- because of the context in the existentials
......
{-# OPTIONS_GHC -fglasgow-exts #-}
{-# LANGUAGE MagicHash, UnboxedTuples #-}
module ShouldCompile where
import Data.Word
......
{-# OPTIONS_GHC -fglasgow-exts #-}
{-# LANGUAGE GADTs #-}
-- !!! deriving for GADTs which declare Haskell98 data types.
-- bug reported as http://hackage.haskell.org/trac/ghc/ticket/902
......
{-# OPTIONS_GHC -fglasgow-exts #-}
{-# LANGUAGE DeriveDataTypeable #-}
-- Deriving Typeable has various special cases
module Foo where
......
{-# OPTIONS -fglasgow-exts #-}
-- July 07: I'm changing this from "should_compile" to "should_fail".
-- It would generate an instance decl like
......
{-# OPTIONS_GHC -fglasgow-exts #-}
{-# LANGUAGE MultiParamTypeClasses, FunctionalDependencies,
FlexibleInstances, GeneralizedNewtypeDeriving #-}
-- Test deriving of a multi-parameter class for
-- one-argument newtype defined in the same module
......
{-# OPTIONS -fglasgow-exts #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
-- Tests newtype unwrapping for the IO monad itself
-- Notice the RenderM monad, which is used in the
......
{-# OPTIONS_GHC -fglasgow-exts #-}
{-# LANGUAGE GADTs #-}
module Arith where
......
{-# OPTIONS_GHC -fglasgow-exts #-}
{-# LANGUAGE GADTs, GeneralizedNewtypeDeriving #-}
-- See Trac #1251 and the comments
-- Note [Pruning dead case alternatives] in types/Unify.lhs
......
{-# OPTIONS -fglasgow-exts -O #-}
{-# LANGUAGE GADTs #-}
{-# OPTIONS_GHC -O #-}
module Gadt17_help (
TernOp (..), applyTernOp
......
{-# OPTIONS_GHC -XGADTs -fglasgow-exts #-}
{-# LANGUAGE GADTs, KindSignatures #-}
module Gadt23_AST where
......
{-# OPTIONS -fglasgow-exts #-}
{-# LANGUAGE GADTs #-}
-- Supplied by Henrik Nilsson, showed up a bug in GADTs
......
{-# OPTIONS -fglasgow-exts #-}
{-# LANGUAGE GADTs, KindSignatures #-}
-- See Trac #1323; crashed GHC 6.6
......
{-# OPTIONS_GHC -Wall -fglasgow-exts #-}
{-# LANGUAGE GADTs, ScopedTypeVariables, FlexibleContexts,
MultiParamTypeClasses #-}
{-# OPTIONS_GHC -Wall #-}
module T2040 where
......
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