Showing 292 of 292 total issues

Use camelCase
Open

type FN_vkDestroyImageView
  =  VkDevice
  -> VkImageView
  -> Ptr VkAllocationCallbacks
  -> IO ()

Found

type FN_vkDestroyImageView =
    VkDevice -> VkImageView -> Ptr VkAllocationCallbacks -> IO ()

Perhaps

type FNVkDestroyImageView =
    VkDevice -> VkImageView -> Ptr VkAllocationCallbacks -> IO ()

Reduce duplication
Open

          renderUploadUniformStorage usObject
Severity: Minor
Found in flaw-editor/exe/model-editor.hs by hlint

Found

renderUploadUniformStorage usObject
renderUniformStorage usObject
renderDraw icObject

Perhaps

Combine with flaw-editor/exe/model-editor.hs:899:11

Use camelCase
Open

type FN_vkDestroyPipeline
  =  VkDevice
  -> VkPipeline
  -> Ptr VkAllocationCallbacks
  -> IO ()

Found

type FN_vkDestroyPipeline =
    VkDevice -> VkPipeline -> Ptr VkAllocationCallbacks -> IO ()

Perhaps

type FNVkDestroyPipeline =
    VkDevice -> VkPipeline -> Ptr VkAllocationCallbacks -> IO ()

Reduce duplication
Open

    verify (== 4) $ atomically $ readEntityVar intVar1
Severity: Minor
Found in flaw-editor/test/entity-test.hs by hlint

Found

verify (== 4) $ atomically $ readEntityVar intVar1
verify (== 5) $ atomically $ readEntityVar intVar2
clientWaitAndSync c1

Perhaps

Combine with flaw-editor/test/entity-test.hs:151:5

Reduce duplication
Open

  (albedoOcclusion, material, viewNormal, depth) <- deferredPipelineLightPassInput $ zw__ screenPositionTexcoord

Found

(albedoOcclusion, material, viewNormal,
 depth) <- deferredPipelineLightPassInput $
             zw__ screenPositionTexcoord
let albedo = xyz__ albedoOcclusion
    diffuse = x_ material
    specular = y_ material
    metalness = zzz__ material
    glossiness = w_ material
viewPositionH <- temp $
                   invProj `mul` cvec211 (xy__ screenPositionTexcoord) depth 1
viewPosition <- temp $ xyz__ viewPositionH / www__ viewPositionH

Perhaps

Combine with flaw-visual/Flaw/Visual/Pipeline/Deferred.hs:224:3

Redundant bracket
Open

registerEntityInterface :: EntityManager -> EntityInterfaceId -> (GetEntity SomeEntityInterface) -> IO ()
Severity: Minor
Found in flaw-editor/Flaw/Editor/Entity.hs by hlint

Found

(GetEntity SomeEntityInterface) -> IO ()

Perhaps

GetEntity SomeEntityInterface -> IO ()

Redundant bracket
Open

    [ patSynSigD v (forallT [PlainTV a] (sequence [(conT ''Vectorized) `appT` (varT a)]) $ foldr (appT . (appT arrowT) . varT) ((conT v) `appT` (varT a)) (replicate (dimN * dimM) a))
Severity: Minor
Found in flaw-math/Flaw/Math.hs by hlint

Found

(conT ''Vectorized) `appT` (varT a)

Perhaps

conT ''Vectorized `appT` (varT a)

Use camelCase
Open

type FN_vkCreateShaderModule
  =  VkDevice
  -> Ptr VkShaderModuleCreateInfo
  -> Ptr VkAllocationCallbacks
  -> Ptr VkShaderModule

Found

type FN_vkCreateShaderModule =
    VkDevice
    -> Ptr VkShaderModuleCreateInfo
       -> Ptr VkAllocationCallbacks -> Ptr VkShaderModule -> IO Word32

Perhaps

type FNVkCreateShaderModule =
    VkDevice
    -> Ptr VkShaderModuleCreateInfo
       -> Ptr VkAllocationCallbacks -> Ptr VkShaderModule -> IO Word32

Use camelCase
Open

data Hb_glyph_position_t

Found

data Hb_glyph_position_t

Perhaps

data HbGlyphPositionT

Use camelCase
Open

hb_glyph_info_t_size :: Int

Found

hb_glyph_info_t_size :: Int

Perhaps

hbGlyphInfoTSize :: Int

Redundant bracket
Open

    [ patSynSigD v (forallT [PlainTV a] (sequence [(conT ''Vectorized) `appT` (varT a)]) $ foldr (appT . (appT arrowT) . varT) ((conT v) `appT` (varT a)) (replicate dim a))
Severity: Minor
Found in flaw-math/Flaw/Math.hs by hlint

Found

(appT arrowT) . varT

Perhaps

appT arrowT . varT

Move guards forward
Open

        [ valD (varP (detName imask jmask)) (normalB $ detExp imask jmask) []
        | imask <- [1..dimMask]
        , jmask <- [1..dimMask]
        , let l = length (maskBits imask)
        , l > 1 && ((1 `shiftL` max 0 (dim - l - 1)) - 1) .&. imask == 0 && l == length (maskBits jmask)
Severity: Minor
Found in flaw-math/Flaw/Math.hs by hlint

Found

[valD (varP (detName imask jmask)) (normalB $ detExp imask jmask)
   []
 | imask <- [1 .. dimMask], jmask <- [1 .. dimMask],
 let l = length (maskBits imask),
 l > 1 &&
   ((1 `shiftL` max 0 (dim - l - 1)) - 1) .&. imask == 0 &&
     l == length (maskBits jmask)]

Perhaps

[valD (varP (detName imask jmask)) (normalB $ detExp imask jmask)
   []
 | imask <- [1 .. dimMask], let l = length (maskBits imask),
 jmask <- [1 .. dimMask],
 l > 1 &&
   ((1 `shiftL` max 0 (dim - l - 1)) - 1) .&. imask == 0 &&
     l == length (maskBits jmask)]

Use camelCase
Open

type FN_vkAllocationFunction =  Ptr () -> CSize -> CSize -> VkSystemAllocationScope -> IO (Ptr ())

Found

type FN_vkAllocationFunction =
    Ptr () -> CSize -> CSize -> VkSystemAllocationScope -> IO (Ptr ())

Perhaps

type FNVkAllocationFunction =
    Ptr () -> CSize -> CSize -> VkSystemAllocationScope -> IO (Ptr ())

Use camelCase
Open

type FN_vkDestroyFramebuffer
  =  VkDevice
  -> VkFramebuffer
  -> Ptr VkAllocationCallbacks
  -> IO ()

Found

type FN_vkDestroyFramebuffer =
    VkDevice -> VkFramebuffer -> Ptr VkAllocationCallbacks -> IO ()

Perhaps

type FNVkDestroyFramebuffer =
    VkDevice -> VkFramebuffer -> Ptr VkAllocationCallbacks -> IO ()

Use camelCase
Open

hb_y_advance :: Ptr Hb_glyph_position_t -> Ptr Hb_position_t

Found

hb_y_advance :: Ptr Hb_glyph_position_t -> Ptr Hb_position_t

Perhaps

hbYAdvance :: Ptr Hb_glyph_position_t -> Ptr Hb_position_t

Use camelCase
Open

hb_codepoint :: Ptr Hb_glyph_info_t -> Ptr Hb_codepoint_t

Found

hb_codepoint :: Ptr Hb_glyph_info_t -> Ptr Hb_codepoint_t

Perhaps

hbCodepoint :: Ptr Hb_glyph_info_t -> Ptr Hb_codepoint_t

Use camelCase
Open

data FT_FaceRec

Found

data FT_FaceRec

Perhaps

data FTFaceRec

Use camelCase
Open

type FT_Face = Ptr FT_FaceRec

Found

type FT_Face = Ptr FT_FaceRec

Perhaps

type FTFace = Ptr FT_FaceRec

Redundant bracket
Open

    [ patSynSigD v (forallT [PlainTV a] (sequence [(conT ''Vectorized) `appT` (varT a)]) $ foldr (appT . (appT arrowT) . varT) ((conT v) `appT` (varT a)) (replicate dim a))
Severity: Minor
Found in flaw-math/Flaw/Math.hs by hlint

Found

(conT v) `appT` (varT a)

Perhaps

(conT v) `appT` varT a

Use tuple-section
Open

    [ newtypeInstD (sequence []) ''Quat [elemType] Nothing (normalC conName [fmap (\t -> (Bang NoSourceUnpackedness NoSourceStrictness, t)) [t| Vec4 $elemType |]]) [derivClause Nothing [ [t| Generic |] ] ]
Severity: Minor
Found in flaw-math/Flaw/Math.hs by hlint

Found

\ t -> (Bang NoSourceUnpackedness NoSourceStrictness, t)

Perhaps

(Bang NoSourceUnpackedness NoSourceStrictness,)

Applying this change:

  • may require {-# LANGUAGE TupleSections #-} adding to the top of the file
Severity
Category
Status
Source
Language