aboutsummaryrefslogtreecommitdiff
diff options
context:
space:
mode:
-rw-r--r--CabalHelper/Compiletime/Data.hs22
-rw-r--r--cabal-helper.cabal6
2 files changed, 14 insertions, 14 deletions
diff --git a/CabalHelper/Compiletime/Data.hs b/CabalHelper/Compiletime/Data.hs
index 6b096d7..346c2a5 100644
--- a/CabalHelper/Compiletime/Data.hs
+++ b/CabalHelper/Compiletime/Data.hs
@@ -14,21 +14,22 @@
-- You should have received a copy of the GNU Affero General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
-{-# LANGUAGE TemplateHaskell #-}
+{-# LANGUAGE TemplateHaskell, ScopedTypeVariables #-}
{-# OPTIONS_GHC -fforce-recomp #-}
module CabalHelper.Compiletime.Data where
import Control.Monad
import Control.Monad.IO.Class
import Data.Functor
-import Data.Time.Clock
-import Data.Time.Clock.POSIX
import qualified Data.ByteString as BS
import qualified Data.ByteString.UTF8 as UTF8
import Language.Haskell.TH
import System.Directory
import System.FilePath
import System.IO.Temp
+import System.Posix.Files
+import System.Posix.Time
+import System.Posix.Types
import Prelude
import CabalHelper.Compiletime.Compat.Environment
@@ -49,20 +50,19 @@ withHelperSources mdir action = withDir mdir $ \dir -> do
createDirectoryIfMissing True $ chdir </> "Runtime"
createDirectoryIfMissing True $ chdir </> "Shared"
- let modtime = read
+ let modtime :: EpochTime
+ modtime = fromIntegral $ (read :: String -> Integer)
-- See https://reproducible-builds.org/specs/source-date-epoch/
$(runIO $ do
- msde <- lookupEnv "SOURCE_DATE_EPOCH"
- let parse :: String -> POSIXTime
- parse = fromInteger . read
- utctime <- getCurrentTime
- return $ LitE . StringL $ show $
- maybe utctime (posixSecondsToUTCTime . parse) msde)
+ msde :: Maybe Integer
+ <- fmap read <$> lookupEnv "SOURCE_DATE_EPOCH"
+ (current_time :: Integer) <- round . toRational <$> epochTime
+ return $ LitE . StringL $ show $ maybe current_time id msde)
liftIO $ forM_ sourceFiles $ \(fn, src) -> do
let path = chdir </> fn
BS.writeFile path $ UTF8.fromString src
- setModificationTime path modtime
+ setFileTimes path modtime modtime
action dir
where
diff --git a/cabal-helper.cabal b/cabal-helper.cabal
index 92570b9..c8c57bd 100644
--- a/cabal-helper.cabal
+++ b/cabal-helper.cabal
@@ -65,6 +65,7 @@ library
, transformers < 0.6 && >= 0.3.0.0
, mtl < 2.3 && >= 2.0
, process < 1.7 && >= 1.1.0.1
+ , unix < 2.8 && >= 2.5.1.1
, ghc-prim
executable cabal-helper-wrapper
@@ -99,7 +100,7 @@ executable cabal-helper-wrapper
, process < 1.7 && >= 1.1.0.1
, temporary < 1.3 && >= 1.2.0.4
, utf8-string < 1.1 && >= 1.0.1.1
- , time < 1.9 && >= 1.4
+ , unix < 2.8 && >= 2.5.1.1
, template-haskell
, ghc-prim
@@ -133,10 +134,9 @@ test-suite compile-test
, process < 1.7 && >= 1.1.0.1
, temporary < 1.3 && >= 1.2.0.4
, utf8-string < 1.1 && >= 1.0.1.1
- , time < 1.9 && >= 1.4
-- additional test deps
- , unix < 2.8 && >= 2.5.1.0
+ , unix < 2.8 && >= 2.5.1.1
, template-haskell
, ghc-prim