Skip to content

Commit

Permalink
format
Browse files Browse the repository at this point in the history
  • Loading branch information
janmasrovira committed Sep 7, 2022
1 parent 2e14cc2 commit e8fc82b
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 4 deletions.
5 changes: 2 additions & 3 deletions src/Juvix/Parser/Lexer.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,5 @@
-- | This module contains lexing functions common to all parsers in the pipeline
-- (Juvix, JuvixCore, JuvixAsm).

module Juvix.Parser.Lexer where

import Control.Monad.Trans.Class (lift)
Expand All @@ -27,8 +26,8 @@ parseFailure off str = P.parseError $ P.FancyError off (Set.singleton (P.ErrorFa
space1 :: (MonadParsec e s m, Token s ~ Char) => m ()
space1 = void $ takeWhile1P (Just "white space (only spaces and newlines allowed)") isWhiteSpace
where
isWhiteSpace :: Char -> Bool
isWhiteSpace = (`elem` [' ', '\n'])
isWhiteSpace :: Char -> Bool
isWhiteSpace = (`elem` [' ', '\n'])

space' :: forall r. Bool -> (forall a. ParsecS r a -> ParsecS r ()) -> ParsecS r ()
space' judoc comment_ = L.space space1 lineComment block
Expand Down
1 change: 0 additions & 1 deletion test/Parsing/Negative.hs
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,6 @@ import Base
import Juvix.Compiler.Pipeline
import Juvix.Parser.Error


root :: FilePath
root = "tests/negative"

Expand Down

0 comments on commit e8fc82b

Please sign in to comment.