Skip to content

Commit

Permalink
Generator: Remove INLINE pragmas
Browse files Browse the repository at this point in the history
This is not so important since there's no specialisation going on here
anyway.
  • Loading branch information
ollef committed Feb 7, 2017
1 parent 36ee2b4 commit 48d75da
Showing 1 changed file with 0 additions and 4 deletions.
4 changes: 0 additions & 4 deletions Text/Earley/Generator/Internal.hs
Original file line number Diff line number Diff line change
Expand Up @@ -260,7 +260,6 @@ generate (st:ss) env = case st of

type Generator t a = forall s. ST s (Result s t a)

{-# INLINE generator #-}
-- | Create a language generator for given grammar and list of allowed tokens.
generator
:: (forall r. Grammar r (Prod r e t a))
Expand All @@ -271,7 +270,6 @@ generator g ts = do
s <- initialState =<< runGrammar (fmap nt . mkRule) g
generate [s] $ emptyGenerationEnv ts

{-# INLINE language #-}
-- | Run a generator, returning all members of the language.
--
-- The members are returned as parse results paired with the list of tokens
Expand All @@ -291,7 +289,6 @@ language gen = runST $ gen >>= go
as <- mas
(as ++) <$> (go =<< k)

{-# INLINE upTo #-}
-- | @upTo n gen@ runs the generator @gen@, returning all members of the
-- language that are of length less than or equal to @n@.
--
Expand All @@ -314,7 +311,6 @@ upTo len gen = runST $ gen >>= go 0
(as ++) <$> (go (curLen + 1) =<< k)
go _ _ = return []

{-# INLINE exactly #-}
-- | @exactly n gen@ runs the generator @gen@, returning all members of the
-- language that are of length equal to @n@.
--
Expand Down

0 comments on commit 48d75da

Please sign in to comment.