[Git][ghc/ghc][wip/T23025] WIP: test
Krzysztof Gogolewski (@monoidal)
gitlab at gitlab.haskell.org
Tue May 16 16:32:14 UTC 2023
Krzysztof Gogolewski pushed to branch wip/T23025 at Glasgow Haskell Compiler / GHC
Commits:
b421cc35 by Krzysztof Gogolewski at 2023-05-16T18:32:04+02:00
WIP: test
- - - - -
6 changed files:
- compiler/GHC/CmmToAsm/CFG/Dominators.hs
- compiler/GHC/CmmToAsm/Wasm.hs
- compiler/GHC/CmmToAsm/Wasm/Asm.hs
- compiler/GHC/CmmToAsm/Wasm/FromCmm.hs
- compiler/GHC/CmmToAsm/Wasm/Types.hs
- compiler/GHC/CmmToAsm/Wasm/Utils.hs
Changes:
=====================================
compiler/GHC/CmmToAsm/CFG/Dominators.hs
=====================================
@@ -2,7 +2,6 @@
{-# LANGUAGE DeriveFunctor #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE RankNTypes #-}
-{-# LANGUAGE Strict #-}
{- |
Module : GHC.CmmToAsm.CFG.Dominators
=====================================
compiler/GHC/CmmToAsm/Wasm.hs
=====================================
@@ -1,6 +1,5 @@
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE OverloadedStrings #-}
-{-# LANGUAGE Strict #-}
module GHC.CmmToAsm.Wasm (ncgWasm) where
=====================================
compiler/GHC/CmmToAsm/Wasm/Asm.hs
=====================================
@@ -3,7 +3,6 @@
{-# LANGUAGE MultiWayIf #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
-{-# LANGUAGE Strict #-}
module GHC.CmmToAsm.Wasm.Asm (asmTellEverything, execWasmAsmM) where
=====================================
compiler/GHC/CmmToAsm/Wasm/FromCmm.hs
=====================================
@@ -6,7 +6,6 @@
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE ScopedTypeVariables #-}
-{-# LANGUAGE Strict #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE UnboxedTuples #-}
=====================================
compiler/GHC/CmmToAsm/Wasm/Types.hs
=====================================
@@ -6,7 +6,6 @@
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE StandaloneDeriving #-}
-{-# LANGUAGE Strict #-}
{-# LANGUAGE TypeFamilyDependencies #-}
{-# LANGUAGE UnboxedTuples #-}
{-# LANGUAGE UndecidableInstances #-}
=====================================
compiler/GHC/CmmToAsm/Wasm/Utils.hs
=====================================
@@ -1,5 +1,4 @@
{-# LANGUAGE OverloadedStrings #-}
-{-# LANGUAGE Strict #-}
module GHC.CmmToAsm.Wasm.Utils
( widthMax,
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/b421cc354d707a8b1610b68d92c16730fb159598
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/b421cc354d707a8b1610b68d92c16730fb159598
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/20230516/58d9c259/attachment-0001.html>
More information about the ghc-commits
mailing list