summaryrefslogtreecommitdiff
path: root/testsuite/tests/simplCore/should_run
diff options
context:
space:
mode:
authorBen Gamari <ben@smart-cactus.org>2020-07-14 11:28:16 -0400
committerMarge Bot <ben+marge-bot@smart-cactus.org>2020-07-15 04:06:08 -0400
commitae11bdfd98a10266bfc7de9e16b500be220307ac (patch)
tree5d6f623fa96997ceebbc0705a5a0813fb028b075 /testsuite/tests/simplCore/should_run
parent51dbfa52df483822b99bb191d2ffc0943954e1d3 (diff)
downloadhaskell-ae11bdfd98a10266bfc7de9e16b500be220307ac.tar.gz
testsuite: Add regression test for #17744
Test due to @monoidal.
Diffstat (limited to 'testsuite/tests/simplCore/should_run')
-rw-r--r--testsuite/tests/simplCore/should_run/T17744.hs14
-rw-r--r--testsuite/tests/simplCore/should_run/T17744.stdout1
-rw-r--r--testsuite/tests/simplCore/should_run/T17744A.hs91
-rw-r--r--testsuite/tests/simplCore/should_run/all.T1
4 files changed, 107 insertions, 0 deletions
diff --git a/testsuite/tests/simplCore/should_run/T17744.hs b/testsuite/tests/simplCore/should_run/T17744.hs
new file mode 100644
index 0000000000..b02fbd6b5c
--- /dev/null
+++ b/testsuite/tests/simplCore/should_run/T17744.hs
@@ -0,0 +1,14 @@
+{-# LANGUAGE OverloadedStrings #-}
+
+module Main where
+
+import T17744A
+
+main :: IO ()
+main = print $ completeResults $ feed "f" $ parse uriScheme
+
+uriScheme :: Format (Parser LeftBiasedLocal) Maybe
+uriScheme = satisfy_ mytake
+
+ipV4address :: Format (Parser LeftBiasedLocal) Maybe
+ipV4address = satisfy_ mytake2
diff --git a/testsuite/tests/simplCore/should_run/T17744.stdout b/testsuite/tests/simplCore/should_run/T17744.stdout
new file mode 100644
index 0000000000..d00491fd7e
--- /dev/null
+++ b/testsuite/tests/simplCore/should_run/T17744.stdout
@@ -0,0 +1 @@
+1
diff --git a/testsuite/tests/simplCore/should_run/T17744A.hs b/testsuite/tests/simplCore/should_run/T17744A.hs
new file mode 100644
index 0000000000..69e18f0ea4
--- /dev/null
+++ b/testsuite/tests/simplCore/should_run/T17744A.hs
@@ -0,0 +1,91 @@
+{-# LANGUAGE FlexibleContexts, FlexibleInstances, GADTs, UndecidableInstances #-}
+
+module T17744A where
+
+import Control.Applicative
+import Data.ByteString (ByteString)
+import qualified Data.ByteString as ByteString
+
+
+data Parser t r where
+ Failure :: Parser t r
+ Result :: ByteString -> r -> Parser t r
+ Delay :: Parser t r -> (ByteString -> Parser t r) -> Parser t r
+
+instance Functor (Parser t) where
+ fmap f (Result s r) = Result s (f r)
+ fmap f p = apply (fmap f) p
+
+instance Applicative (Parser t) where
+ pure = return
+
+instance Monad (Parser t) where
+ return = Result mempty
+ Result s r >>= f = feed s (f r)
+ p >>= f = apply (>>= f) p
+
+data LeftBiasedLocal
+
+instance Alternative (Parser LeftBiasedLocal)
+
+instance (Alternative (Parser t)) => LookAheadParsing (Parser t)
+
+class Alternative m => Parsing m where
+ unexpected :: m a
+
+instance (Alternative (Parser t)) => Parsing (Parser t) where
+ unexpected = undefined
+
+class Parsing m => LookAheadParsing m
+
+class LookAheadParsing m => InputParsing m where
+ takex :: m ByteString
+
+class (Parsing m, InputParsing m) => InputCharParsing m
+
+feed :: ByteString -> Parser t r -> Parser t r
+feed s (Result s' r) = Result (mappend s' s) r
+feed s (Delay _ f) = f s
+
+completeResults :: Parser t r -> Int
+completeResults (Result _ _) = 1
+completeResults _ = 0
+
+
+apply :: (Parser t r -> Parser t r') -> Parser t r -> Parser t r'
+apply _ Failure = Failure
+apply g (Delay e f) = Delay (g e) (g . f)
+apply f p = Delay (f p) (\s-> f $ feed s p)
+
+
+instance (Alternative (Parser t )) =>
+ InputParsing (Parser t ) where
+ takex = p
+ where p = Delay Failure f
+ f s = if ByteString.null s then p else
+ case ByteString.splitAt 1 s of
+ (first, rest) -> Result rest first
+
+
+instance (LookAheadParsing (Parser t)) => InputCharParsing (Parser t) where
+
+data Format m n = Format {
+ parse :: m ByteString,
+ serialize :: n ()
+ }
+
+mytake :: (InputParsing m, Alternative n) => Format m n
+mytake = Format{
+ parse = takex,
+ serialize = pure ()
+ }
+
+mytake2 :: (InputCharParsing m, Alternative n) => Format m n
+mytake2 = mytake
+
+satisfy_ :: (Parsing m, Monad m) => Format m n -> Format m n
+satisfy_ f = Format{
+ parse = parse f >>= pure,
+ serialize = undefined
+ }
+
diff --git a/testsuite/tests/simplCore/should_run/all.T b/testsuite/tests/simplCore/should_run/all.T
index 48e3d90961..efaf5efdde 100644
--- a/testsuite/tests/simplCore/should_run/all.T
+++ b/testsuite/tests/simplCore/should_run/all.T
@@ -91,3 +91,4 @@ test('T16066', exit_code(1), compile_and_run, ['-O1'])
test('T17206', exit_code(1), compile_and_run, [''])
test('T17151', [], multimod_compile_and_run, ['T17151', ''])
test('T18012', normal, compile_and_run, [''])
+test('T17744', normal, compile_and_run, [''])