Skip to content
Snippets Groups Projects
Commit 21c72e7d authored by Edward Z. Yang's avatar Edward Z. Yang
Browse files

Split off quotes/ from th/ for tests that can be done on stage1 compiler.


Signed-off-by: default avatarEdward Z. Yang <ezyang@cs.stanford.edu>

Test Plan: run these tests with stage1

Reviewers: simonpj, austin

Subscribers: bgamari, thomie

Differential Revision: https://phabricator.haskell.org/D877

GHC Trac Issues: #10382
parent 28257cae
No related branches found
No related tags found
No related merge requests found
Showing
with 36 additions and 32 deletions
T3572
T8633
TH_ppr1
TH_spliceViewPat/TH_spliceViewPat
TOP=../..
include $(TOP)/mk/boilerplate.mk
include $(TOP)/mk/test.mk
{-# LANGUAGE TemplateHaskell #-}
-- Trac #2632
module MkData where
......
{-# LANGUAGE TemplateHaskell #-}
-- Trac #2931
module Foo where
a = 1
-- NB: no newline after the 'a'!
b = 'a
\ No newline at end of file
b = 'a
File moved
{-# LANGUAGE TemplateHaskell, TypeFamilies, RankNTypes, FlexibleContexts #-}
{-# LANGUAGE TypeFamilies, RankNTypes, FlexibleContexts #-}
module T4056 where
import Language.Haskell.TH
......
{-# LANGUAGE TemplateHaskell #-}
-- Crashed GHC 6.12
module T4165 where
......
{-# LANGUAGE TemplateHaskell #-}
module T4170 where
import Language.Haskell.TH
......
{-# LANGUAGE TemplateHaskell, ScopedTypeVariables #-}
{-# LANGUAGE ScopedTypeVariables #-}
module T5371 where
import Language.Haskell.TH
......
{-# LANGUAGE TemplateHaskell #-}
module T6062 where
x = [| False True |]
{-# LANGUAGE DataKinds #-}
module T8455 where
ty = [t| 5 |]
module Main where
import Language.Haskell.TH.Syntax
t1 = case mkName "^.." of
Name (OccName ".") (NameQ (ModName "^")) -> error "bug0"
Name (OccName "^..") NameS -> return ()
t2 = case mkName "Control.Lens.^.." of
Name (OccName ".") (NameQ (ModName "Control.Lens.^")) -> error "bug1"
Name (OccName "^..") (NameQ (ModName "Control.Lens")) -> return ()
t3 = case mkName "Data.Bits..&." of
Name (OccName ".&.") (NameQ (ModName "Data.Bits")) -> return ()
t4 = case mkName "abcde" of
Name (OccName "abcde") NameS -> return ()
main :: IO ()
main = do t1; t2; t3; t4
\ No newline at end of file
module Main where
import Language.Haskell.TH.Syntax
t1 = case mkName "^.." of
Name (OccName ".") (NameQ (ModName "^")) -> error "bug0"
Name (OccName "^..") NameS -> return ()
t2 = case mkName "Control.Lens.^.." of
Name (OccName ".") (NameQ (ModName "Control.Lens.^")) -> error "bug1"
Name (OccName "^..") (NameQ (ModName "Control.Lens")) -> return ()
t3 = case mkName "Data.Bits..&." of
Name (OccName ".&.") (NameQ (ModName "Data.Bits")) -> return ()
t4 = case mkName "abcde" of
Name (OccName "abcde") NameS -> return ()
main :: IO ()
main = do t1; t2; t3; t4
{-# LANGUAGE TemplateHaskell, PatternSynonyms #-}
{-# LANGUAGE PatternSynonyms #-}
module T8759a where
......
{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fwarn-unused-matches #-}
module T9824 where
......
-- Check that declarations in a bracket shadow the top-level
-- Check that declarations in a bracket shadow the top-level
-- declarations, rather than clashing with them.
module TH_bracket1 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