[Git][ghc/ghc][wip/js-staging] Fix hlint errors on CI
Sylvain Henry (@hsyl20)
gitlab at gitlab.haskell.org
Thu Oct 20 16:48:05 UTC 2022
Sylvain Henry pushed to branch wip/js-staging at Glasgow Haskell Compiler / GHC
Commits:
05468a97 by Sylvain Henry at 2022-10-20T18:51:30+02:00
Fix hlint errors on CI
- - - - -
11 changed files:
- compiler/GHC/Driver/Pipeline/Execute.hs
- compiler/GHC/Iface/Binary.hs
- compiler/GHC/JS/Transform.hs
- compiler/GHC/StgToJS/Apply.hs
- compiler/GHC/StgToJS/Closure.hs
- compiler/GHC/StgToJS/FFI.hs
- compiler/GHC/StgToJS/Linker/Linker.hs
- compiler/GHC/StgToJS/Monad.hs
- compiler/GHC/StgToJS/Object.hs
- compiler/GHC/StgToJS/Prim.hs
- compiler/GHC/StgToJS/Stack.hs
Changes:
=====================================
compiler/GHC/Driver/Pipeline/Execute.hs
=====================================
@@ -4,7 +4,6 @@
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE GADTs #-}
-{-# LANGUAGE LambdaCase #-}
{-# OPTIONS_GHC -Wno-incomplete-uni-patterns #-}
#include <ghcplatform.h>
=====================================
compiler/GHC/Iface/Binary.hs
=====================================
@@ -1,4 +1,4 @@
-{-# LANGUAGE BinaryLiterals, ScopedTypeVariables, BangPatterns #-}
+{-# LANGUAGE BinaryLiterals, ScopedTypeVariables #-}
--
-- (c) The University of Glasgow 2002-2006
=====================================
compiler/GHC/JS/Transform.hs
=====================================
@@ -6,7 +6,6 @@
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE BlockArguments #-}
-{-# LANGUAGE PatternSynonyms #-}
module GHC.JS.Transform
( mapIdent
=====================================
compiler/GHC/StgToJS/Apply.hs
=====================================
@@ -1,5 +1,4 @@
{-# LANGUAGE LambdaCase #-}
-{-# LANGUAGE TupleSections #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE BlockArguments #-}
=====================================
compiler/GHC/StgToJS/Closure.hs
=====================================
@@ -1,4 +1,3 @@
-{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
=====================================
compiler/GHC/StgToJS/FFI.hs
=====================================
@@ -1,4 +1,3 @@
-{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE MultiWayIf #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE OverloadedStrings #-}
=====================================
compiler/GHC/StgToJS/Linker/Linker.hs
=====================================
@@ -1,4 +1,3 @@
-{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE LambdaCase #-}
@@ -538,10 +537,9 @@ collectDeps mod_deps packages all_deps = do
(map (\(m,v) -> (moduleUnitId m,[v])) (M.toList mod_deps))
ar_state <- emptyArchiveState
- code <- fmap (catMaybes . concat) . forM packages' $ \pkg ->
+ fmap (catMaybes . concat) . forM packages' $ \pkg ->
mapM (uncurry $ extractDeps ar_state units_by_module)
(fromMaybe [] $ M.lookup pkg mod_deps_bypkg)
- return code
extractDeps :: ArchiveState
-> Map Module IntSet
=====================================
compiler/GHC/StgToJS/Monad.hs
=====================================
@@ -1,6 +1,5 @@
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TupleSections #-}
-{-# LANGUAGE BangPatterns #-}
{-# LANGUAGE LambdaCase #-}
-- | JS codegen state monad
=====================================
compiler/GHC/StgToJS/Object.hs
=====================================
@@ -3,7 +3,6 @@
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE Rank2Types #-}
{-# LANGUAGE ScopedTypeVariables #-}
-{-# LANGUAGE TupleSections #-}
-- only for DB.Binary instances on Module
{-# OPTIONS_GHC -fno-warn-orphans #-}
=====================================
compiler/GHC/StgToJS/Prim.hs
=====================================
@@ -1,5 +1,3 @@
-{-# LANGUAGE LambdaCase #-}
-{-# LANGUAGE TupleSections #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE MultiWayIf #-}
=====================================
compiler/GHC/StgToJS/Stack.hs
=====================================
@@ -1,5 +1,4 @@
{-# LANGUAGE OverloadedStrings #-}
-{-# LANGUAGE TupleSections #-}
-----------------------------------------------------------------------------
-- |
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/05468a9781839680f9700e857845eeb56fc5623b
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/05468a9781839680f9700e857845eeb56fc5623b
You're receiving this email because of your account on gitlab.haskell.org.
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20221020/d7c73670/attachment-0001.html>
More information about the ghc-commits
mailing list