telescope-0.2.0: Astronomical Observations (FITS, ASDF, WCS, etc)
Safe HaskellNone
LanguageGHC2021

Telescope.Data.WCS

Synopsis

Documentation

newtype CUnit Source #

Constructors

CUnit Text 

Instances

Instances details
Show CUnit Source # 
Instance details

Defined in Telescope.Data.WCS

Methods

showsPrec :: Int -> CUnit -> ShowS #

show :: CUnit -> String #

showList :: [CUnit] -> ShowS #

Eq CUnit Source # 
Instance details

Defined in Telescope.Data.WCS

Methods

(==) :: CUnit -> CUnit -> Bool #

(/=) :: CUnit -> CUnit -> Bool #

FromKeyword CUnit Source # 
Instance details

Defined in Telescope.Fits.Header.Class

Methods

parseKeywordValue :: forall (es :: [Effect]). Parser :> es => Value -> Eff es CUnit Source #

ToKeyword CUnit Source # 
Instance details

Defined in Telescope.Fits.Header.Class

newtype CType Source #

Constructors

CType Text 

Instances

Instances details
Show CType Source # 
Instance details

Defined in Telescope.Data.WCS

Methods

showsPrec :: Int -> CType -> ShowS #

show :: CType -> String #

showList :: [CType] -> ShowS #

Eq CType Source # 
Instance details

Defined in Telescope.Data.WCS

Methods

(==) :: CType -> CType -> Bool #

(/=) :: CType -> CType -> Bool #

FromKeyword CType Source # 
Instance details

Defined in Telescope.Fits.Header.Class

Methods

parseKeywordValue :: forall (es :: [Effect]). Parser :> es => Value -> Eff es CType Source #

ToKeyword CType Source # 
Instance details

Defined in Telescope.Fits.Header.Class

data WCSAxis (alt :: WCSAlt) (axis :: k) Source #

Typed WCS Axes

data X
data Y

myFunction :: WCSAxis 'WCSMain X -> WCSAxis 'WCSMain Y -> Header
myFunction wcsx wcsy =
  toHeader wcsx <> toHeader wcsy

Constructors

WCSAxis 

Fields

Instances

Instances details
Generic (WCSAxis alt axis) Source # 
Instance details

Defined in Telescope.Data.WCS

Associated Types

type Rep (WCSAxis alt axis) 
Instance details

Defined in Telescope.Data.WCS

Methods

from :: WCSAxis alt axis -> Rep (WCSAxis alt axis) x #

to :: Rep (WCSAxis alt axis) x -> WCSAxis alt axis #

Show (WCSAxis alt axis) Source # 
Instance details

Defined in Telescope.Data.WCS

Methods

showsPrec :: Int -> WCSAxis alt axis -> ShowS #

show :: WCSAxis alt axis -> String #

showList :: [WCSAxis alt axis] -> ShowS #

Eq (WCSAxis alt axis) Source # 
Instance details

Defined in Telescope.Data.WCS

Methods

(==) :: WCSAxis alt axis -> WCSAxis alt axis -> Bool #

(/=) :: WCSAxis alt axis -> WCSAxis alt axis -> Bool #

(AxisOrder ax, KnownText alt) => FromHeader (WCSAxis alt ax) Source # 
Instance details

Defined in Telescope.Fits.Header.Class

Methods

parseHeader :: forall (es :: [Effect]). Parser :> es => Header -> Eff es (WCSAxis alt ax) Source #

(AxisOrder ax, KnownText alt) => ToHeader (WCSAxis alt ax) Source # 
Instance details

Defined in Telescope.Fits.Header.Class

Methods

toHeader :: WCSAxis alt ax -> Header Source #

type Rep (WCSAxis alt axis) Source # 
Instance details

Defined in Telescope.Data.WCS

data WCSAlt Source #

WCSAlt options

Constructors

WCSMain 
A 
B 

Instances

Instances details
KnownText 'A Source # 
Instance details

Defined in Telescope.Data.WCS

KnownText 'B Source # 
Instance details

Defined in Telescope.Data.WCS

KnownText 'WCSMain Source # 
Instance details

Defined in Telescope.Data.WCS

toWCSAxisKey :: forall {k1} {k2} (alt :: k1) (ax :: k2). (KnownText alt, AxisOrder ax) => Text -> Text Source #

Converts a wcs keyword like "ctype" to CTYPE1A for header parsing