| Safe Haskell | None |
|---|---|
| Language | GHC2021 |
Telescope.Fits.Header.Class
Documentation
class ToKeyword a where Source #
Minimal complete definition
Methods
toKeywordValue :: a -> Value Source #
toKeywordRecord :: Text -> a -> KeywordRecord Source #
default toKeywordRecord :: Text -> a -> KeywordRecord Source #
Instances
class FromKeyword a where Source #
Instances
| FromKeyword CType Source # | |
Defined in Telescope.Fits.Header.Class | |
| FromKeyword CUnit Source # | |
Defined in Telescope.Fits.Header.Class | |
| FromKeyword Text Source # | |
Defined in Telescope.Fits.Header.Class | |
| FromKeyword Bool Source # | |
Defined in Telescope.Fits.Header.Class | |
| FromKeyword Float Source # | |
Defined in Telescope.Fits.Header.Class | |
| FromKeyword Int Source # | |
Defined in Telescope.Fits.Header.Class | |
class ToHeader a where Source #
Minimal complete definition
Nothing
Methods
class FromHeader a where Source #
Minimal complete definition
Nothing
parseKeyword :: forall a (es :: [Effect]). (FromKeyword a, Parser :> es) => Text -> Header -> Eff es a Source #
class GToHeader (f :: k -> Type) where Source #
Instances
| (GToHeader f, GToHeader g) => GToHeader (f :*: g :: k -> Type) Source # | |
| GToHeader f => GToHeader (M1 C c f :: k -> Type) Source # | |
| GToHeader f => GToHeader (M1 D c f :: k -> Type) Source # | |
| (ToHeader a, Selector s) => GToHeader (M1 S s (K1 R (HeaderFor a) :: k -> Type) :: k -> Type) Source # | |
| (ToKeyword a, Selector s) => GToHeader (M1 S s (K1 R (Maybe a) :: k -> Type) :: k -> Type) Source # | |
| (ToKeyword a, Selector s) => GToHeader (M1 S s (K1 R a :: k -> Type) :: k -> Type) Source # | |
class GFromHeader (f :: k -> Type) where Source #
Methods
gParseHeader :: forall (es :: [Effect]) (p :: k). Parser :> es => Header -> Eff es (f p) Source #
Instances
| (GFromHeader f, GFromHeader g) => GFromHeader (f :*: g :: k -> Type) Source # | |
Defined in Telescope.Fits.Header.Class | |
| GFromHeader f => GFromHeader (M1 C c f :: k -> Type) Source # | |
| GFromHeader f => GFromHeader (M1 D c f :: k -> Type) Source # | |
| (FromKeyword a, Selector s) => GFromHeader (M1 S s (K1 R (Maybe a) :: k -> Type) :: k -> Type) Source # | |
| (FromKeyword a, Selector s) => GFromHeader (M1 S s (K1 R a :: k -> Type) :: k -> Type) Source # | |
cleanKeyword :: String -> Text Source #
Constructors
| HeaderFor a |