Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data LibType
- prefix :: LibType -> Bool -> Text
- describe' :: LibType -> String
- supported :: LibType -> Bool
- supportedLibraries :: [LibType]
- outDir :: LibType -> FilePath
- outModule :: LibType -> Text
- srcDir :: LibType -> CodeGenType -> FilePath
- data CodeGenType
- generatable :: CodeGenType -> Bool
- data TemplateType
- generatedTypes :: LibType -> CodeGenType -> [TemplateType]
Documentation
All possible libraries that we intend to support (these are all src libraries in ATen). Note that this ordering is used in codegen and must not be changed.
Instances
Bounded LibType Source # | |
Enum LibType Source # | |
Eq LibType Source # | |
Data LibType Source # | |
Defined in CodeGen.Types.CLI gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LibType -> c LibType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LibType # toConstr :: LibType -> Constr # dataTypeOf :: LibType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LibType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LibType) # gmapT :: (forall b. Data b => b -> b) -> LibType -> LibType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LibType -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LibType -> r # gmapQ :: (forall d. Data d => d -> u) -> LibType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LibType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LibType -> m LibType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LibType -> m LibType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LibType -> m LibType # | |
Ord LibType Source # | |
Read LibType Source # | |
Show LibType Source # | |
Generic LibType Source # | |
Hashable LibType Source # | |
Defined in CodeGen.Types.CLI | |
type Rep LibType Source # | |
Defined in CodeGen.Types.CLI type Rep LibType = D1 (MetaData "LibType" "CodeGen.Types.CLI" "hasktorch-codegen-0.0.1.1-inplace" False) ((C1 (MetaCons "ATen" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "THCUNN" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "THCS" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "THC" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "THNN" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "THS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TH" PrefixI False) (U1 :: Type -> Type)))) |
supported :: LibType -> Bool Source #
Whether or not we currently support code generation for the library
supportedLibraries :: [LibType] Source #
srcDir :: LibType -> CodeGenType -> FilePath Source #
Where the source files are located, relative to the root of the hasktorch project.
data CodeGenType Source #
Type of code to generate
GenericFiles | generic/ files which are used in C for type-generic code |
ConcreteFiles | concrete supporting files. These include utility functions and random generators. |
Instances
generatable :: CodeGenType -> Bool Source #
Whether or not we currently support generating this type of code (ie: I (@stites) am not sure about the managed files).
data TemplateType Source #
Instances
generatedTypes :: LibType -> CodeGenType -> [TemplateType] Source #