2008-01-13 20:53:15 +03:00
|
|
|
|
-- |
|
2015-07-28 16:32:19 +03:00
|
|
|
|
-- Module : Text.MegaParsec.Perm
|
2015-07-30 19:20:37 +03:00
|
|
|
|
-- Copyright : © 2015 MegaParsec contributors
|
|
|
|
|
-- © 2007 Paolo Martini
|
|
|
|
|
-- © 1999–2001 Daan Leijen
|
2015-07-28 16:32:19 +03:00
|
|
|
|
-- License : BSD3
|
|
|
|
|
--
|
|
|
|
|
-- Maintainer : Mark Karpov <markkarpov@opmbx.org>
|
2015-07-29 11:38:32 +03:00
|
|
|
|
-- Stability : experimental
|
2008-01-13 20:53:15 +03:00
|
|
|
|
-- Portability : non-portable (uses existentially quantified data constructors)
|
2015-07-28 16:32:19 +03:00
|
|
|
|
--
|
|
|
|
|
-- This module implements permutation parsers. The algorithm used is fairly
|
|
|
|
|
-- complex since we push the type system to its limits :-) The algorithm is
|
|
|
|
|
-- described in:
|
|
|
|
|
--
|
|
|
|
|
-- /Parsing Permutation Phrases,/ by Arthur Baars, Andres Loh and Doaitse
|
|
|
|
|
-- Swierstra. Published as a functional pearl at the Haskell Workshop 2001.
|
2008-01-13 20:53:15 +03:00
|
|
|
|
|
2015-07-28 16:32:19 +03:00
|
|
|
|
module Text.MegaParsec.Perm
|
2015-07-30 18:45:06 +03:00
|
|
|
|
( StreamPermParser -- abstract
|
2008-01-13 20:53:15 +03:00
|
|
|
|
, permute
|
2015-07-28 16:32:19 +03:00
|
|
|
|
, (<||>)
|
|
|
|
|
, (<$$>)
|
|
|
|
|
, (<|?>)
|
|
|
|
|
, (<$?>) )
|
|
|
|
|
where
|
2008-01-13 20:53:15 +03:00
|
|
|
|
|
|
|
|
|
import Control.Monad.Identity
|
|
|
|
|
|
2015-07-28 16:32:19 +03:00
|
|
|
|
import Text.MegaParsec
|
|
|
|
|
|
2008-01-13 20:53:15 +03:00
|
|
|
|
infixl 1 <||>, <|?>
|
|
|
|
|
infixl 2 <$$>, <$?>
|
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
-- Building a permutation parser
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
|
|
|
|
-- | The expression @perm \<||> p@ adds parser @p@ to the permutation
|
2015-07-30 18:45:06 +03:00
|
|
|
|
-- parser @perm@. The parser @p@ is not allowed to accept empty input — use
|
|
|
|
|
-- the optional combinator ('<|?>') instead. Returns a new permutation
|
|
|
|
|
-- parser that includes @p@.
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
(<||>) :: Stream s Identity tok => StreamPermParser s st (a -> b) ->
|
|
|
|
|
Parsec s st a -> StreamPermParser s st b
|
|
|
|
|
(<||>) = add
|
2008-01-13 20:53:15 +03:00
|
|
|
|
|
2008-01-20 07:39:29 +03:00
|
|
|
|
-- | The expression @f \<$$> p@ creates a fresh permutation parser
|
2015-07-30 18:45:06 +03:00
|
|
|
|
-- consisting of parser @p@. The the final result of the permutation parser
|
|
|
|
|
-- is the function @f@ applied to the return value of @p@. The parser @p@ is
|
|
|
|
|
-- not allowed to accept empty input - use the optional combinator ('<$?>')
|
|
|
|
|
-- instead.
|
2008-01-20 07:39:29 +03:00
|
|
|
|
--
|
2015-07-30 18:45:06 +03:00
|
|
|
|
-- If the function @f@ takes more than one parameter, the type variable @b@
|
|
|
|
|
-- is instantiated to a functional type which combines nicely with the adds
|
|
|
|
|
-- parser @p@ to the ('<||>') combinator. This results in stylized code
|
|
|
|
|
-- where a permutation parser starts with a combining function @f@ followed
|
|
|
|
|
-- by the parsers. The function @f@ gets its parameters in the order in
|
|
|
|
|
-- which the parsers are specified, but actual input can be in any order.
|
|
|
|
|
|
|
|
|
|
(<$$>) :: Stream s Identity tok => (a -> b) ->
|
|
|
|
|
Parsec s st a -> StreamPermParser s st b
|
|
|
|
|
f <$$> p = newperm f <||> p
|
|
|
|
|
|
|
|
|
|
-- | The expression @perm \<||> (x, p)@ adds parser @p@ to the
|
|
|
|
|
-- permutation parser @perm@. The parser @p@ is optional — if it can not be
|
|
|
|
|
-- applied, the default value @x@ will be used instead. Returns a new
|
|
|
|
|
-- permutation parser that includes the optional parser @p@.
|
|
|
|
|
|
|
|
|
|
(<|?>) :: Stream s Identity tok => StreamPermParser s st (a -> b) ->
|
|
|
|
|
(a, Parsec s st a) -> StreamPermParser s st b
|
|
|
|
|
perm <|?> (x, p) = addopt perm x p
|
|
|
|
|
|
|
|
|
|
-- | The expression @f \<$?> (x, p)@ creates a fresh permutation parser
|
|
|
|
|
-- consisting of parser @p@. The the final result of the permutation parser
|
|
|
|
|
-- is the function @f@ applied to the return value of @p@. The parser @p@ is
|
|
|
|
|
-- optional — if it can not be applied, the default value @x@ will be used
|
|
|
|
|
-- instead.
|
|
|
|
|
|
|
|
|
|
(<$?>) :: Stream s Identity tok => (a -> b) ->
|
|
|
|
|
(a, Parsec s st a) -> StreamPermParser s st b
|
|
|
|
|
f <$?> xp = newperm f <|?> xp
|
|
|
|
|
|
|
|
|
|
-- The permutation tree
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
-- | The type @StreamPermParser s st a@ denotes a permutation parser that,
|
|
|
|
|
-- when converted by the 'permute' function, parses @s@ streams with user
|
|
|
|
|
-- state @st@ and returns a value of type @a@ on success.
|
|
|
|
|
--
|
|
|
|
|
-- Normally, a permutation parser is first build with special operators like
|
|
|
|
|
-- ('<||>') and than transformed into a normal parser using 'permute'.
|
2008-01-13 20:53:15 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
data StreamPermParser s st a = Perm (Maybe a) [StreamBranch s st a]
|
2008-01-13 20:53:15 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
data StreamBranch s st a =
|
|
|
|
|
forall b. Branch (StreamPermParser s st (b -> a)) (Parsec s st b)
|
2008-01-13 20:53:15 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
-- | The parser @permute perm@ parses a permutation of parser described
|
|
|
|
|
-- by @perm@. For example, suppose we want to parse a permutation of: an
|
|
|
|
|
-- optional string of @a@'s, the character @b@ and an optional @c@. This can
|
|
|
|
|
-- be described by:
|
|
|
|
|
--
|
|
|
|
|
-- > test = permute (tuple <$?> ("", many1 (char 'a'))
|
|
|
|
|
-- > <||> char 'b'
|
|
|
|
|
-- > <|?> ('_', char 'c'))
|
|
|
|
|
-- > where tuple a b c = (a, b, c)
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
-- Transform a permutation tree into a normal parser
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
permute :: Stream s Identity tok => StreamPermParser s st a -> Parsec s st a
|
|
|
|
|
permute (Perm def xs) = choice (fmap branch xs ++ empty)
|
|
|
|
|
where empty = case def of
|
|
|
|
|
Nothing -> []
|
|
|
|
|
Just x -> [return x]
|
|
|
|
|
branch (Branch perm p) = (flip ($)) <$> p <*> permute perm
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
-- Build permutation trees
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
newperm :: Stream s Identity tok => (a -> b) -> StreamPermParser s st (a -> b)
|
|
|
|
|
newperm f = Perm (Just f) []
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
add :: Stream s Identity tok => StreamPermParser s st (a -> b) ->
|
|
|
|
|
Parsec s st a -> StreamPermParser s st b
|
|
|
|
|
add perm@(Perm _mf fs) p = Perm Nothing (first : fmap insert fs)
|
|
|
|
|
where first = Branch perm p
|
|
|
|
|
insert (Branch perm' p') = Branch (add (mapPerms flip perm') p) p'
|
2008-01-20 07:39:29 +03:00
|
|
|
|
|
2015-07-30 18:45:06 +03:00
|
|
|
|
addopt :: Stream s Identity tok => StreamPermParser s st (a -> b) ->
|
|
|
|
|
a -> Parsec s st a -> StreamPermParser s st b
|
2008-01-13 20:53:15 +03:00
|
|
|
|
addopt perm@(Perm mf fs) x p
|
|
|
|
|
= Perm (fmap ($ x) mf) (first:map insert fs)
|
2015-07-30 18:45:06 +03:00
|
|
|
|
where first = Branch perm p
|
|
|
|
|
insert (Branch perm' p') = Branch (addopt (mapPerms flip perm') x p) p'
|
|
|
|
|
|
|
|
|
|
mapPerms :: Stream s Identity tok => (a -> b) ->
|
|
|
|
|
StreamPermParser s st a -> StreamPermParser s st b
|
|
|
|
|
mapPerms f (Perm x xs) = Perm (fmap f x) (map mapBranch xs)
|
|
|
|
|
where mapBranch (Branch perm p) = Branch (mapPerms (f.) perm) p
|