Movatterモバイル変換


[0]ホーム

URL:


time-1.14: A time library
Safe HaskellSafe
LanguageHaskell2010

Data.Time.LocalTime

Contents

Synopsis

Time zones

dataTimeZoneSource#

A TimeZone is a whole number of minutes offset from UTC, together with a name and a "just for summer" flag.

Constructors

TimeZone 

Fields

Instances

Instances details
DataTimeZoneSource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeZone

Methods

gfoldl :: (forall d b.Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) ->TimeZone -> cTimeZone#

gunfold :: (forall b r.Data b => c (b -> r) -> c r) -> (forall r. r -> c r) ->Constr -> cTimeZone#

toConstr ::TimeZone ->Constr#

dataTypeOf ::TimeZone ->DataType#

dataCast1 ::Typeable t => (forall d.Data d => c (t d)) ->Maybe (cTimeZone)#

dataCast2 ::Typeable t => (forall d e. (Data d,Data e) => c (t d e)) ->Maybe (cTimeZone)#

gmapT :: (forall b.Data b => b -> b) ->TimeZone ->TimeZone#

gmapQl :: (r -> r' -> r) -> r -> (forall d.Data d => d -> r') ->TimeZone -> r#

gmapQr ::forall r r'. (r' -> r -> r) -> r -> (forall d.Data d => d -> r') ->TimeZone -> r#

gmapQ :: (forall d.Data d => d -> u) ->TimeZone -> [u]#

gmapQi ::Int -> (forall d.Data d => d -> u) ->TimeZone -> u#

gmapM ::Monad m => (forall d.Data d => d -> m d) ->TimeZone -> mTimeZone#

gmapMp ::MonadPlus m => (forall d.Data d => d -> m d) ->TimeZone -> mTimeZone#

gmapMo ::MonadPlus m => (forall d.Data d => d -> m d) ->TimeZone -> mTimeZone#

GenericTimeZoneSource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeZone

Associated Types

typeRepTimeZone ::Type ->Type#

ReadTimeZoneSource#

This only works for±HHMM format, single-letter military time-zones, and these time-zones: "UTC", "UT", "GMT", "EST", "EDT", "CST", "CDT", "MST", "MDT", "PST", "PDT", per RFC 822 section 5.

Instance details

Defined inData.Time.Format.Parse

ShowTimeZoneSource#

This only shows the time zone name, or offset if the name is empty.

Instance details

Defined inData.Time.LocalTime.Internal.TimeZone

NFDataTimeZoneSource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeZone

Methods

rnf ::TimeZone -> ()#

EqTimeZoneSource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeZone

OrdTimeZoneSource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeZone

FormatTimeTimeZoneSource# 
Instance details

Defined inData.Time.Format.Format.Instances

ISO8601TimeZoneSource#

±hh:mm [ISO 8601:2004(E) sec. 4.2.5.1 extended format]

Instance details

Defined inData.Time.Format.ISO8601

ParseTimeTimeZoneSource# 
Instance details

Defined inData.Time.Format.Parse.Instances

typeRepTimeZoneSource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeZone

typeRepTimeZone =D1 ('MetaData "TimeZone" "Data.Time.LocalTime.Internal.TimeZone" "time-1.14-FUp5siqKs8fGXR1yavxc1V" 'False) (C1 ('MetaCons "TimeZone" 'PrefixI 'True) (S1 ('MetaSel ('Just "timeZoneMinutes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0Int):*: (S1 ('MetaSel ('Just "timeZoneSummerOnly") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0Bool):*:S1 ('MetaSel ('Just "timeZoneName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0String))))

timeZoneOffsetString ::TimeZone ->StringSource#

Text representing the offset of this timezone, such as "-0800" or "+0400" (like%z in formatTime).

timeZoneOffsetString' ::MaybeChar ->TimeZone ->StringSource#

Text representing the offset of this timezone, such as "-0800" or "+0400" (like%z in formatTime), with arbitrary padding.

minutesToTimeZone ::Int ->TimeZoneSource#

Create a nameless non-summer timezone for this number of minutes.

hoursToTimeZone ::Int ->TimeZoneSource#

Create a nameless non-summer timezone for this number of hours.

utc ::TimeZoneSource#

The UTC time zone.

getTimeZone ::UTCTime ->IOTimeZoneSource#

Get the configured time-zone for a given time (varying as per summertime adjustments).

On Unix systems the output of this function depends on:

  1. The value ofTZ environment variable (if set)
  2. The system time zone (usually configured by/etc/localtime symlink)

For details see tzset(3) and localtime(3).

Example:

> let t =UTCTime (fromGregorian 2021 7 1) 0>getTimeZone tCEST>setEnv "TZ" "America/New_York" >>getTimeZone tEDT>setEnv "TZ" "Europe/Berlin" >>getTimeZone tCEST

On Windows systems the output of this function depends on:

  1. The value ofTZ environment variable (if set). Seehere for how Windows interprets this variable.
  2. The system time zone, configured in Settings

getCurrentTimeZone ::IOTimeZoneSource#

Get the configured time-zone for the current time.

Time of day

dataTimeOfDaySource#

Time of day as represented in hour, minute and second (with picoseconds), typically used to express local time of day.

TimeOfDay 24 0 0 is considered invalid for the purposes ofmakeTimeOfDayValid, as well as reading and parsing, but valid for ISO 8601 parsing inData.Time.Format.ISO8601.

Constructors

TimeOfDay 

Fields

  • todHour ::Int

    range 0 - 23

  • todMin ::Int

    range 0 - 59

  • todSec ::Pico

    Note that 0 <=todSec < 61, accomodating leap seconds. Any local minute may have a leap second, since leap seconds happen in all zones simultaneously

Instances

Instances details
DataTimeOfDaySource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeOfDay

Methods

gfoldl :: (forall d b.Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) ->TimeOfDay -> cTimeOfDay#

gunfold :: (forall b r.Data b => c (b -> r) -> c r) -> (forall r. r -> c r) ->Constr -> cTimeOfDay#

toConstr ::TimeOfDay ->Constr#

dataTypeOf ::TimeOfDay ->DataType#

dataCast1 ::Typeable t => (forall d.Data d => c (t d)) ->Maybe (cTimeOfDay)#

dataCast2 ::Typeable t => (forall d e. (Data d,Data e) => c (t d e)) ->Maybe (cTimeOfDay)#

gmapT :: (forall b.Data b => b -> b) ->TimeOfDay ->TimeOfDay#

gmapQl :: (r -> r' -> r) -> r -> (forall d.Data d => d -> r') ->TimeOfDay -> r#

gmapQr ::forall r r'. (r' -> r -> r) -> r -> (forall d.Data d => d -> r') ->TimeOfDay -> r#

gmapQ :: (forall d.Data d => d -> u) ->TimeOfDay -> [u]#

gmapQi ::Int -> (forall d.Data d => d -> u) ->TimeOfDay -> u#

gmapM ::Monad m => (forall d.Data d => d -> m d) ->TimeOfDay -> mTimeOfDay#

gmapMp ::MonadPlus m => (forall d.Data d => d -> m d) ->TimeOfDay -> mTimeOfDay#

gmapMo ::MonadPlus m => (forall d.Data d => d -> m d) ->TimeOfDay -> mTimeOfDay#

GenericTimeOfDaySource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeOfDay

Associated Types

typeRepTimeOfDay ::Type ->Type#

ReadTimeOfDaySource# 
Instance details

Defined inData.Time.Format.Parse

ShowTimeOfDaySource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeOfDay

NFDataTimeOfDaySource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeOfDay

Methods

rnf ::TimeOfDay -> ()#

EqTimeOfDaySource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeOfDay

OrdTimeOfDaySource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeOfDay

FormatTimeTimeOfDaySource# 
Instance details

Defined inData.Time.Format.Format.Instances

ISO8601TimeOfDaySource#

hh:mm:ss[.ss] [ISO 8601:2004(E) sec. 4.2.2.2, 4.2.2.4(a) extended format]

Instance details

Defined inData.Time.Format.ISO8601

ParseTimeTimeOfDaySource# 
Instance details

Defined inData.Time.Format.Parse.Instances

typeRepTimeOfDaySource# 
Instance details

Defined inData.Time.LocalTime.Internal.TimeOfDay

typeRepTimeOfDay =D1 ('MetaData "TimeOfDay" "Data.Time.LocalTime.Internal.TimeOfDay" "time-1.14-FUp5siqKs8fGXR1yavxc1V" 'False) (C1 ('MetaCons "TimeOfDay" 'PrefixI 'True) (S1 ('MetaSel ('Just "todHour") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0Int):*: (S1 ('MetaSel ('Just "todMin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0Int):*:S1 ('MetaSel ('Just "todSec") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0Pico))))

midnight ::TimeOfDaySource#

Hour zero

midday ::TimeOfDaySource#

Hour twelve

makeTimeOfDayValid ::Int ->Int ->Pico ->MaybeTimeOfDaySource#

timeToDaysAndTimeOfDay ::NominalDiffTime -> (Integer,TimeOfDay)Source#

Convert a period of time into a count of days and a time of day since midnight. The time of day will never have a leap second.

daysAndTimeOfDayToTime ::Integer ->TimeOfDay ->NominalDiffTimeSource#

Convert a count of days and a time of day since midnight into a period of time.

utcToLocalTimeOfDay ::TimeZone ->TimeOfDay -> (Integer,TimeOfDay)Source#

Convert a time of day in UTC to a time of day in some timezone, together with a day adjustment.

localToUTCTimeOfDay ::TimeZone ->TimeOfDay -> (Integer,TimeOfDay)Source#

Convert a time of day in some timezone to a time of day in UTC, together with a day adjustment.

timeToTimeOfDay ::DiffTime ->TimeOfDaySource#

Get the time of day given a time since midnight. Time more than 24h will be converted to leap-seconds.

pastMidnight ::DiffTime ->TimeOfDaySource#

Same astimeToTimeOfDay.

timeOfDayToTime ::TimeOfDay ->DiffTimeSource#

Get the time since midnight for a given time of day.

sinceMidnight ::TimeOfDay ->DiffTimeSource#

Same astimeOfDayToTime.

dayFractionToTimeOfDay ::Rational ->TimeOfDaySource#

Get the time of day given the fraction of a day since midnight.

timeOfDayToDayFraction ::TimeOfDay ->RationalSource#

Get the fraction of a day since midnight given a time of day.

Calendar Duration

dataCalendarDiffTimeSource#

Constructors

CalendarDiffTime 

Instances

Instances details
DataCalendarDiffTimeSource#

Since: 1.9.2

Instance details

Defined inData.Time.LocalTime.Internal.CalendarDiffTime

Methods

gfoldl :: (forall d b.Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) ->CalendarDiffTime -> cCalendarDiffTime#

gunfold :: (forall b r.Data b => c (b -> r) -> c r) -> (forall r. r -> c r) ->Constr -> cCalendarDiffTime#

toConstr ::CalendarDiffTime ->Constr#

dataTypeOf ::CalendarDiffTime ->DataType#

dataCast1 ::Typeable t => (forall d.Data d => c (t d)) ->Maybe (cCalendarDiffTime)#

dataCast2 ::Typeable t => (forall d e. (Data d,Data e) => c (t d e)) ->Maybe (cCalendarDiffTime)#

gmapT :: (forall b.Data b => b -> b) ->CalendarDiffTime ->CalendarDiffTime#

gmapQl :: (r -> r' -> r) -> r -> (forall d.Data d => d -> r') ->CalendarDiffTime -> r#

gmapQr ::forall r r'. (r' -> r -> r) -> r -> (forall d.Data d => d -> r') ->CalendarDiffTime -> r#

gmapQ :: (forall d.Data d => d -> u) ->CalendarDiffTime -> [u]#

gmapQi ::Int -> (forall d.Data d => d -> u) ->CalendarDiffTime -> u#

gmapM ::Monad m => (forall d.Data d => d -> m d) ->CalendarDiffTime -> mCalendarDiffTime#

gmapMp ::MonadPlus m => (forall d.Data d => d -> m d) ->CalendarDiffTime -> mCalendarDiffTime#

gmapMo ::MonadPlus m => (forall d.Data d => d -> m d) ->CalendarDiffTime -> mCalendarDiffTime#

MonoidCalendarDiffTimeSource#

Additive

Instance details

Defined inData.Time.LocalTime.Internal.CalendarDiffTime

SemigroupCalendarDiffTimeSource#

Additive

Instance details

Defined inData.Time.LocalTime.Internal.CalendarDiffTime

GenericCalendarDiffTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.CalendarDiffTime

Associated Types

typeRepCalendarDiffTime ::Type ->Type#

ReadCalendarDiffTimeSource# 
Instance details

Defined inData.Time.Format.ISO8601

ShowCalendarDiffTimeSource# 
Instance details

Defined inData.Time.Format.ISO8601

NFDataCalendarDiffTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.CalendarDiffTime

Methods

rnf ::CalendarDiffTime -> ()#

EqCalendarDiffTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.CalendarDiffTime

FormatTimeCalendarDiffTimeSource# 
Instance details

Defined inData.Time.Format.Format.Instances

ISO8601CalendarDiffTimeSource#

PyYmMdDThHmMs[.ss]S [ISO 8601:2004(E) sec. 4.4.3.2]

Instance details

Defined inData.Time.Format.ISO8601

ParseTimeCalendarDiffTimeSource# 
Instance details

Defined inData.Time.Format.Parse.Instances

typeRepCalendarDiffTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.CalendarDiffTime

typeRepCalendarDiffTime =D1 ('MetaData "CalendarDiffTime" "Data.Time.LocalTime.Internal.CalendarDiffTime" "time-1.14-FUp5siqKs8fGXR1yavxc1V" 'False) (C1 ('MetaCons "CalendarDiffTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "ctMonths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0Integer):*:S1 ('MetaSel ('Just "ctTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0NominalDiffTime)))

calendarTimeDays ::CalendarDiffDays ->CalendarDiffTimeSource#

calendarTimeTime ::NominalDiffTime ->CalendarDiffTimeSource#

scaleCalendarDiffTime ::Integer ->CalendarDiffTime ->CalendarDiffTimeSource#

Scale by a factor. Note thatscaleCalendarDiffTime (-1) will not perfectly invert a duration, due to variable month lengths.

Local Time

dataLocalTimeSource#

A simple day and time aggregate, where the day is of the specified parameter, and the time is a TimeOfDay. Conversion of this (as local civil time) to UTC depends on the time zone. Conversion of this (as local mean time) to UT1 depends on the longitude.

Constructors

LocalTime 

Instances

Instances details
DataLocalTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.LocalTime

Methods

gfoldl :: (forall d b.Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) ->LocalTime -> cLocalTime#

gunfold :: (forall b r.Data b => c (b -> r) -> c r) -> (forall r. r -> c r) ->Constr -> cLocalTime#

toConstr ::LocalTime ->Constr#

dataTypeOf ::LocalTime ->DataType#

dataCast1 ::Typeable t => (forall d.Data d => c (t d)) ->Maybe (cLocalTime)#

dataCast2 ::Typeable t => (forall d e. (Data d,Data e) => c (t d e)) ->Maybe (cLocalTime)#

gmapT :: (forall b.Data b => b -> b) ->LocalTime ->LocalTime#

gmapQl :: (r -> r' -> r) -> r -> (forall d.Data d => d -> r') ->LocalTime -> r#

gmapQr ::forall r r'. (r' -> r -> r) -> r -> (forall d.Data d => d -> r') ->LocalTime -> r#

gmapQ :: (forall d.Data d => d -> u) ->LocalTime -> [u]#

gmapQi ::Int -> (forall d.Data d => d -> u) ->LocalTime -> u#

gmapM ::Monad m => (forall d.Data d => d -> m d) ->LocalTime -> mLocalTime#

gmapMp ::MonadPlus m => (forall d.Data d => d -> m d) ->LocalTime -> mLocalTime#

gmapMo ::MonadPlus m => (forall d.Data d => d -> m d) ->LocalTime -> mLocalTime#

GenericLocalTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.LocalTime

Associated Types

typeRepLocalTime ::Type ->Type#

ReadLocalTimeSource# 
Instance details

Defined inData.Time.Format.Parse

ShowLocalTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.LocalTime

NFDataLocalTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.LocalTime

Methods

rnf ::LocalTime -> ()#

EqLocalTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.LocalTime

OrdLocalTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.LocalTime

FormatTimeLocalTimeSource# 
Instance details

Defined inData.Time.Format.Format.Instances

ISO8601LocalTimeSource#

yyyy-mm-ddThh:mm:ss[.ss] [ISO 8601:2004(E) sec. 4.3.2 extended format]

Instance details

Defined inData.Time.Format.ISO8601

ParseTimeLocalTimeSource# 
Instance details

Defined inData.Time.Format.Parse.Instances

typeRepLocalTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.LocalTime

typeRepLocalTime =D1 ('MetaData "LocalTime" "Data.Time.LocalTime.Internal.LocalTime" "time-1.14-FUp5siqKs8fGXR1yavxc1V" 'False) (C1 ('MetaCons "LocalTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "localDay") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0Day):*:S1 ('MetaSel ('Just "localTimeOfDay") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0TimeOfDay)))

addLocalTime ::NominalDiffTime ->LocalTime ->LocalTimeSource#

addLocalTime a b = a + b

diffLocalTime ::LocalTime ->LocalTime ->NominalDiffTimeSource#

diffLocalTime a b = a - b

utcToLocalTime ::TimeZone ->UTCTime ->LocalTimeSource#

Get the local time of a UTC time in a time zone.

localTimeToUTC ::TimeZone ->LocalTime ->UTCTimeSource#

Get the UTC time of a local time in a time zone.

ut1ToLocalTime ::Rational ->UniversalTime ->LocalTimeSource#

Get the local time of a UT1 time on a particular meridian (in degrees, positive is East).

localTimeToUT1 ::Rational ->LocalTime ->UniversalTimeSource#

Get the UT1 time of a local time on a particular meridian (in degrees, positive is East).

dataZonedTimeSource#

A local time together with a time zone.

There is noEq instance forZonedTime. If you want to compare local times, usezonedTimeToLocalTime. If you want to compare absolute times, usezonedTimeToUTC.

Constructors

ZonedTime 

Instances

Instances details
DataZonedTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.ZonedTime

Methods

gfoldl :: (forall d b.Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) ->ZonedTime -> cZonedTime#

gunfold :: (forall b r.Data b => c (b -> r) -> c r) -> (forall r. r -> c r) ->Constr -> cZonedTime#

toConstr ::ZonedTime ->Constr#

dataTypeOf ::ZonedTime ->DataType#

dataCast1 ::Typeable t => (forall d.Data d => c (t d)) ->Maybe (cZonedTime)#

dataCast2 ::Typeable t => (forall d e. (Data d,Data e) => c (t d e)) ->Maybe (cZonedTime)#

gmapT :: (forall b.Data b => b -> b) ->ZonedTime ->ZonedTime#

gmapQl :: (r -> r' -> r) -> r -> (forall d.Data d => d -> r') ->ZonedTime -> r#

gmapQr ::forall r r'. (r' -> r -> r) -> r -> (forall d.Data d => d -> r') ->ZonedTime -> r#

gmapQ :: (forall d.Data d => d -> u) ->ZonedTime -> [u]#

gmapQi ::Int -> (forall d.Data d => d -> u) ->ZonedTime -> u#

gmapM ::Monad m => (forall d.Data d => d -> m d) ->ZonedTime -> mZonedTime#

gmapMp ::MonadPlus m => (forall d.Data d => d -> m d) ->ZonedTime -> mZonedTime#

gmapMo ::MonadPlus m => (forall d.Data d => d -> m d) ->ZonedTime -> mZonedTime#

GenericZonedTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.ZonedTime

Associated Types

typeRepZonedTime ::Type ->Type#

ReadZonedTimeSource#

This only works for azonedTimeZone in±HHMM format, single-letter military time-zones, and these time-zones: "UTC", "UT", "GMT", "EST", "EDT", "CST", "CDT", "MST", "MDT", "PST", "PDT", per RFC 822 section 5.

Instance details

Defined inData.Time.Format.Parse

ShowZonedTimeSource#

For the time zone, this only shows the name, or offset if the name is empty.

Instance details

Defined inData.Time.LocalTime.Internal.ZonedTime

NFDataZonedTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.ZonedTime

Methods

rnf ::ZonedTime -> ()#

FormatTimeZonedTimeSource# 
Instance details

Defined inData.Time.Format.Format.Instances

ISO8601ZonedTimeSource#

yyyy-mm-ddThh:mm:ss[.ss]±hh:mm [ISO 8601:2004(E) sec. 4.3.2 extended format]

Instance details

Defined inData.Time.Format.ISO8601

ParseTimeZonedTimeSource# 
Instance details

Defined inData.Time.Format.Parse.Instances

typeRepZonedTimeSource# 
Instance details

Defined inData.Time.LocalTime.Internal.ZonedTime

typeRepZonedTime =D1 ('MetaData "ZonedTime" "Data.Time.LocalTime.Internal.ZonedTime" "time-1.14-FUp5siqKs8fGXR1yavxc1V" 'False) (C1 ('MetaCons "ZonedTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "zonedTimeToLocalTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0LocalTime):*:S1 ('MetaSel ('Just "zonedTimeZone") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0TimeZone)))

utcToZonedTime ::TimeZone ->UTCTime ->ZonedTimeSource#

zonedTimeToUTC ::ZonedTime ->UTCTimeSource#

getZonedTime ::IOZonedTimeSource#

utcToLocalZonedTime ::UTCTime ->IOZonedTimeSource#

Produced byHaddock version 2.29.1


[8]ページ先頭

©2009-2025 Movatter.jp