module OpcXmlDaClient.XmlSchemaValues.Util.TimeMath where

import Data.Time.Calendar.OrdinalDate
import OpcXmlDaClient.Base.Prelude

negateDay :: Day -> Day
negateDay :: Day -> Day
negateDay Day
x =
  case Day -> (Integer, Int)
toOrdinalDate Day
x of
    (Integer
year, Int
dayOfYear) -> Integer -> Int -> Day
fromOrdinalDate (Integer -> Integer
forall a. Num a => a -> a
negate Integer
year) Int
dayOfYear