{-# LANGUAGE CPP #-}
module GetModificationTime where
import HaskellIO
import DialogueIO

#ifdef VERSION_old_time
getModificationTime :: FilePath
-> (IOError -> f hi ho) -> (ClockTime -> f hi ho) -> f hi ho
getModificationTime FilePath
path IOError -> f hi ho
err ClockTime -> f hi ho
cont =
    forall {f :: * -> * -> *} {hi} {ho}.
FudgetIO f =>
Request -> (IOError -> f hi ho) -> (Response -> f hi ho) -> f hi ho
hIOerr (FilePath -> Request
GetModificationTime FilePath
path) IOError -> f hi ho
err forall a b. (a -> b) -> a -> b
$ \ (ClockTime ClockTime
t) ->
    ClockTime -> f hi ho
cont ClockTime
t
#else
getModificationTime path err cont =
    hIOerr (GetModificationTime path) err $ \ (UTCTime t) ->
    cont t
#endif