Search is not available for this dataset
repo_name
string | path
string | license
string | full_code
string | full_size
int64 | uncommented_code
string | uncommented_size
int64 | function_only_code
string | function_only_size
int64 | is_commented
bool | is_signatured
bool | n_ast_errors
int64 | ast_max_depth
int64 | n_whitespaces
int64 | n_ast_nodes
int64 | n_ast_terminals
int64 | n_ast_nonterminals
int64 | loc
int64 | cycloplexity
int64 |
---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
mbakke/ganeti | src/Ganeti/Query/Instance.hs | bsd-2-clause | instanceLiveFieldExtract n _ _ = J.showJSON $
"The field " ++ n ++ " is not an expected or extractable live field!" | 117 | instanceLiveFieldExtract n _ _ = J.showJSON $
"The field " ++ n ++ " is not an expected or extractable live field!" | 117 | instanceLiveFieldExtract n _ _ = J.showJSON $
"The field " ++ n ++ " is not an expected or extractable live field!" | 117 | false | false | 0 | 8 | 23 | 27 | 13 | 14 | null | null |
onponomarev/ganeti | src/Ganeti/Query/Filter.hs | bsd-2-clause | trueFilter :: JSValue -> ErrorResult Bool
trueFilter (JSBool x) = Ok $! x | 73 | trueFilter :: JSValue -> ErrorResult Bool
trueFilter (JSBool x) = Ok $! x | 73 | trueFilter (JSBool x) = Ok $! x | 31 | false | true | 0 | 7 | 12 | 31 | 15 | 16 | null | null |
nomeata/ghc | compiler/cmm/PprC.hs | bsd-3-clause | signedOp :: MachOp -> Bool -- Argument type(s) are signed ints
signedOp (MO_S_Quot _) = True | 100 | signedOp :: MachOp -> Bool
signedOp (MO_S_Quot _) = True | 59 | signedOp (MO_S_Quot _) = True | 32 | true | true | 0 | 7 | 23 | 25 | 13 | 12 | null | null |
ikirill/ComputationalMathematics | Cube/Cube.hs | gpl-3.0 | cuberotLeftCCW = P.inv cuberotLeftCW | 36 | cuberotLeftCCW = P.inv cuberotLeftCW | 36 | cuberotLeftCCW = P.inv cuberotLeftCW | 36 | false | false | 0 | 6 | 3 | 11 | 5 | 6 | null | null |
HJvT/com | System/Win32/Com/Server/ConnectionPoint.hs | bsd-3-clause | findConnectionPoint :: [(IID (IUnknown ()), IConnectionPoint ())]
-> ThisPtr
-> Ptr GUID
-> Ptr (Ptr (IUnknown ()))
-> IO HRESULT
findConnectionPoint ls this riid ppCP
| ppCP == nullPtr = return e_POINTER
| otherwise = do
guid <- unmarshallGUID False riid
let iid = guidToIID guid
case (lookup iid ls) of
Nothing -> do
poke ppCP nullPtr
return cONNECT_E_NOCONNECTION
Just i -> do
writeIUnknown True ppCP i
return s_OK | 580 | findConnectionPoint :: [(IID (IUnknown ()), IConnectionPoint ())]
-> ThisPtr
-> Ptr GUID
-> Ptr (Ptr (IUnknown ()))
-> IO HRESULT
findConnectionPoint ls this riid ppCP
| ppCP == nullPtr = return e_POINTER
| otherwise = do
guid <- unmarshallGUID False riid
let iid = guidToIID guid
case (lookup iid ls) of
Nothing -> do
poke ppCP nullPtr
return cONNECT_E_NOCONNECTION
Just i -> do
writeIUnknown True ppCP i
return s_OK | 580 | findConnectionPoint ls this riid ppCP
| ppCP == nullPtr = return e_POINTER
| otherwise = do
guid <- unmarshallGUID False riid
let iid = guidToIID guid
case (lookup iid ls) of
Nothing -> do
poke ppCP nullPtr
return cONNECT_E_NOCONNECTION
Just i -> do
writeIUnknown True ppCP i
return s_OK | 370 | false | true | 1 | 14 | 231 | 190 | 85 | 105 | null | null |
rueshyna/gogol | gogol-fitness/gen/Network/Google/Fitness/Types/Product.hs | mpl-2.0 | -- | Flag to indicate server has more data to transfer
lsrHasMoreData :: Lens' ListSessionsResponse (Maybe Bool)
lsrHasMoreData
= lens _lsrHasMoreData
(\ s a -> s{_lsrHasMoreData = a}) | 192 | lsrHasMoreData :: Lens' ListSessionsResponse (Maybe Bool)
lsrHasMoreData
= lens _lsrHasMoreData
(\ s a -> s{_lsrHasMoreData = a}) | 137 | lsrHasMoreData
= lens _lsrHasMoreData
(\ s a -> s{_lsrHasMoreData = a}) | 79 | true | true | 0 | 9 | 35 | 48 | 25 | 23 | null | null |
tiqwab/md-parser | src/Text/Md/MdParser.hs | bsd-3-clause | concatMapMdFormat meta (w:ws) = writeMarkDown w meta ++ "\n" ++ concatMapMdFormat meta ws | 89 | concatMapMdFormat meta (w:ws) = writeMarkDown w meta ++ "\n" ++ concatMapMdFormat meta ws | 89 | concatMapMdFormat meta (w:ws) = writeMarkDown w meta ++ "\n" ++ concatMapMdFormat meta ws | 89 | false | false | 0 | 7 | 12 | 38 | 17 | 21 | null | null |
bacchanalia/KitchenSink | KitchenSink/Qualified.hs | gpl-3.0 | -- |'BinaryBuilder.putCharUtf8'
binb_putCharUtf8 = BinaryBuilder.putCharUtf8 | 76 | binb_putCharUtf8 = BinaryBuilder.putCharUtf8 | 44 | binb_putCharUtf8 = BinaryBuilder.putCharUtf8 | 44 | true | false | 0 | 5 | 4 | 9 | 5 | 4 | null | null |
jaalonso/I1M-Cod-Temas | src/Tema_6.hs | gpl-2.0 | -- ---------------------------------------------------------------------
-- Recusión sobre lista --
-- ---------------------------------------------------------------------
-- (product xs) es el producto de los números de xs. Por ejemplo,
-- product [7,5,2] == 70
product :: Num a => [a] -> a
product [] = 1 | 361 | product :: Num a => [a] -> a
product [] = 1 | 47 | product [] = 1 | 18 | true | true | 0 | 7 | 92 | 35 | 20 | 15 | null | null |
omefire/lens | src/Control/Lens/Getter.hs | bsd-3-clause | -- | This is a generalized form of 'listen' that only extracts the portion of
-- the log that is focused on by a 'Getter'. If given a 'Fold' or a 'Traversal'
-- then a monoidal summary of the parts of the log that are visited will be
-- returned.
--
-- @
-- 'ilistening' :: 'MonadWriter' w m => 'IndexedGetter' i w u -> m a -> m (a, (i, u))
-- 'ilistening' :: 'MonadWriter' w m => 'IndexedLens'' i w u -> m a -> m (a, (i, u))
-- 'ilistening' :: ('MonadWriter' w m, 'Monoid' u) => 'IndexedFold' i w u -> m a -> m (a, (i, u))
-- 'ilistening' :: ('MonadWriter' w m, 'Monoid' u) => 'IndexedTraversal'' i w u -> m a -> m (a, (i, u))
-- @
ilistening :: MonadWriter w m => IndexedGetting i (i, u) w u -> m a -> m (a, (i, u))
ilistening l m = do
(a, w) <- listen m
return (a, iview l w)
| 822 | ilistening :: MonadWriter w m => IndexedGetting i (i, u) w u -> m a -> m (a, (i, u))
ilistening l m = do
(a, w) <- listen m
return (a, iview l w)
| 150 | ilistening l m = do
(a, w) <- listen m
return (a, iview l w)
| 65 | true | true | 0 | 11 | 213 | 114 | 62 | 52 | null | null |
olsner/ghc | compiler/hsSyn/HsExpr.hs | bsd-3-clause | ppr_cmd :: forall id. (OutputableBndrId id) => HsCmd id -> SDoc
ppr_cmd (HsCmdPar c) = parens (ppr_lcmd c) | 106 | ppr_cmd :: forall id. (OutputableBndrId id) => HsCmd id -> SDoc
ppr_cmd (HsCmdPar c) = parens (ppr_lcmd c) | 106 | ppr_cmd (HsCmdPar c) = parens (ppr_lcmd c) | 42 | false | true | 0 | 8 | 17 | 54 | 26 | 28 | null | null |
sgf-dma/sgf-xmonad-modules | src/Sgf/XMonad/Docks.hs | bsd-3-clause | ppSepL :: LensA PP String
ppSepL f z@PP {ppSep = x}
= fmap (\x' -> z{ppSep = x'}) (f x) | 107 | ppSepL :: LensA PP String
ppSepL f z@PP {ppSep = x}
= fmap (\x' -> z{ppSep = x'}) (f x) | 107 | ppSepL f z@PP {ppSep = x}
= fmap (\x' -> z{ppSep = x'}) (f x) | 81 | false | true | 0 | 9 | 39 | 60 | 32 | 28 | null | null |
haskell/ghc-builder | common/Builder/Files.hs | bsd-3-clause | getMaybeBuildStepArgs :: MonadIO m
=> Root -> BuildNum -> BuildStepNum -> m (Maybe String)
getMaybeBuildStepArgs root bn bsn
= maybeReadBinaryFile (fpBuildStepArgs root bn bsn) | 199 | getMaybeBuildStepArgs :: MonadIO m
=> Root -> BuildNum -> BuildStepNum -> m (Maybe String)
getMaybeBuildStepArgs root bn bsn
= maybeReadBinaryFile (fpBuildStepArgs root bn bsn) | 199 | getMaybeBuildStepArgs root bn bsn
= maybeReadBinaryFile (fpBuildStepArgs root bn bsn) | 86 | false | true | 0 | 11 | 46 | 59 | 28 | 31 | null | null |
seahug/parconc-examples | distrib-ping/ping-tc2.hs | bsd-3-clause | waitForPongs :: ReceivePort Message -> [ProcessId] -> ProcessM ()
waitForPongs port [] = return () | 98 | waitForPongs :: ReceivePort Message -> [ProcessId] -> ProcessM ()
waitForPongs port [] = return () | 98 | waitForPongs port [] = return () | 32 | false | true | 0 | 8 | 14 | 42 | 20 | 22 | null | null |
xmonad/xmonad-contrib | XMonad/Actions/WindowGo.hs | bsd-3-clause | -- | See 'raiseMaybe'. If the Window can't be found, quietly give up and do nothing.
raise :: Query Bool -> X ()
raise = raiseMaybe $ return () | 143 | raise :: Query Bool -> X ()
raise = raiseMaybe $ return () | 58 | raise = raiseMaybe $ return () | 30 | true | true | 0 | 7 | 28 | 33 | 16 | 17 | null | null |
castaway/pandoc | src/Text/Pandoc/Biblio.hs | gpl-2.0 | processCite s cs (x:xs) = bottomUp (processCite s cs) x : processCite s cs xs | 77 | processCite s cs (x:xs) = bottomUp (processCite s cs) x : processCite s cs xs | 77 | processCite s cs (x:xs) = bottomUp (processCite s cs) x : processCite s cs xs | 77 | false | false | 0 | 8 | 14 | 44 | 21 | 23 | null | null |
rgleichman/glance | app/Rendering.hs | gpl-3.0 | graphvizScaleFactor :: (Fractional a) => a
-- For Neato
graphvizScaleFactor = 0.12 | 83 | graphvizScaleFactor :: (Fractional a) => a
graphvizScaleFactor = 0.12 | 69 | graphvizScaleFactor = 0.12 | 26 | true | true | 0 | 7 | 12 | 28 | 13 | 15 | null | null |
rocio/rethinkdb | scripts/adtproto/Compile.hs | agpl-3.0 | checkDeclType (TypeDeclEnum d) = checkDeclEnum d | 48 | checkDeclType (TypeDeclEnum d) = checkDeclEnum d | 48 | checkDeclType (TypeDeclEnum d) = checkDeclEnum d | 48 | false | false | 0 | 7 | 5 | 18 | 8 | 10 | null | null |
slpopejoy/fadno-xml | src/Fadno/MusicXml/MusicXml20.hs | bsd-2-clause | parseOtherDirection :: P.XParse OtherDirection
parseOtherDirection =
OtherDirection
<$> (P.xtext >>= return)
<*> P.optional (P.xattr (P.name "print-object") >>= parseYesNo)
<*> P.optional (P.xattr (P.name "default-x") >>= parseTenths)
<*> P.optional (P.xattr (P.name "default-y") >>= parseTenths)
<*> P.optional (P.xattr (P.name "relative-x") >>= parseTenths)
<*> P.optional (P.xattr (P.name "relative-y") >>= parseTenths)
<*> P.optional (P.xattr (P.name "font-family") >>= parseCommaSeparatedText)
<*> P.optional (P.xattr (P.name "font-style") >>= parseFontStyle)
<*> P.optional (P.xattr (P.name "font-size") >>= parseFontSize)
<*> P.optional (P.xattr (P.name "font-weight") >>= parseFontWeight)
<*> P.optional (P.xattr (P.name "color") >>= parseColor) | 848 | parseOtherDirection :: P.XParse OtherDirection
parseOtherDirection =
OtherDirection
<$> (P.xtext >>= return)
<*> P.optional (P.xattr (P.name "print-object") >>= parseYesNo)
<*> P.optional (P.xattr (P.name "default-x") >>= parseTenths)
<*> P.optional (P.xattr (P.name "default-y") >>= parseTenths)
<*> P.optional (P.xattr (P.name "relative-x") >>= parseTenths)
<*> P.optional (P.xattr (P.name "relative-y") >>= parseTenths)
<*> P.optional (P.xattr (P.name "font-family") >>= parseCommaSeparatedText)
<*> P.optional (P.xattr (P.name "font-style") >>= parseFontStyle)
<*> P.optional (P.xattr (P.name "font-size") >>= parseFontSize)
<*> P.optional (P.xattr (P.name "font-weight") >>= parseFontWeight)
<*> P.optional (P.xattr (P.name "color") >>= parseColor) | 848 | parseOtherDirection =
OtherDirection
<$> (P.xtext >>= return)
<*> P.optional (P.xattr (P.name "print-object") >>= parseYesNo)
<*> P.optional (P.xattr (P.name "default-x") >>= parseTenths)
<*> P.optional (P.xattr (P.name "default-y") >>= parseTenths)
<*> P.optional (P.xattr (P.name "relative-x") >>= parseTenths)
<*> P.optional (P.xattr (P.name "relative-y") >>= parseTenths)
<*> P.optional (P.xattr (P.name "font-family") >>= parseCommaSeparatedText)
<*> P.optional (P.xattr (P.name "font-style") >>= parseFontStyle)
<*> P.optional (P.xattr (P.name "font-size") >>= parseFontSize)
<*> P.optional (P.xattr (P.name "font-weight") >>= parseFontWeight)
<*> P.optional (P.xattr (P.name "color") >>= parseColor) | 801 | false | true | 33 | 11 | 175 | 354 | 175 | 179 | null | null |
rimmington/cabal | Cabal/Distribution/Simple/BuildPaths.hs | bsd-3-clause | -- ---------------------------------------------------------------------------
-- Library file names
mkLibName :: LibraryName -> String
mkLibName lib = "lib" ++ getHSLibraryName lib <.> "a" | 190 | mkLibName :: LibraryName -> String
mkLibName lib = "lib" ++ getHSLibraryName lib <.> "a" | 88 | mkLibName lib = "lib" ++ getHSLibraryName lib <.> "a" | 53 | true | true | 0 | 7 | 20 | 31 | 16 | 15 | null | null |
kvelicka/Fizz | PictureDSL.hs | lgpl-2.1 | evalPicture (source :> Anim ps) =
do
pictures <- sequence $ (map (\x -> evalPicture (source :> x)) ps)
return $ Animate animControl True pictures [] | 163 | evalPicture (source :> Anim ps) =
do
pictures <- sequence $ (map (\x -> evalPicture (source :> x)) ps)
return $ Animate animControl True pictures [] | 163 | evalPicture (source :> Anim ps) =
do
pictures <- sequence $ (map (\x -> evalPicture (source :> x)) ps)
return $ Animate animControl True pictures [] | 163 | false | false | 0 | 15 | 40 | 74 | 36 | 38 | null | null |
ryantm/ghc | compiler/utils/Encoding.hs | bsd-3-clause | decode_lower ch = {-pprTrace "decode_lower" (char ch)-} ch | 59 | decode_lower ch = {-pprTrace "decode_lower" (char ch)-} ch | 59 | decode_lower ch = {-pprTrace "decode_lower" (char ch)-} ch | 59 | false | false | 0 | 5 | 8 | 14 | 6 | 8 | null | null |
keithodulaigh/Hets | SoftFOL/Sign.hs | gpl-2.0 | {- |
Check a Sign if it is single sorted (and the sort is non-generated).
-}
singleSortNotGen :: Sign -> Bool
singleSortNotGen spSig = singleSorted spSig &&
isNothing (head . Map.elems $ sortMap spSig) | 221 | singleSortNotGen :: Sign -> Bool
singleSortNotGen spSig = singleSorted spSig &&
isNothing (head . Map.elems $ sortMap spSig) | 142 | singleSortNotGen spSig = singleSorted spSig &&
isNothing (head . Map.elems $ sortMap spSig) | 109 | true | true | 0 | 10 | 53 | 50 | 23 | 27 | null | null |
pgj/bead | test/Test/Property/Persistence.hs | bsd-3-clause | complexTests = group "Persistence Layer Complex tests" $ do
test initPersistenceLayer
userAssignmentKeyTests
courseOrGroupAssignmentTest
groupDescriptionTest
submissionDescTest
courseNameAndAdminsTest
submissionListDescTest
lastEvaluationTest
submissionDetailsDescTest
submissionTablesTest
userSubmissionDescTest
courseKeysTest
assignmentKeyTest
filterSubmissionsTest
modifyAssignmentsTest
modifyEvaluationTest
deleteUsersFromCourseTest
deleteUsersFromCourseNegativeTest
unsubscribeFromSubscribedGroupsTest
saveLoadAndModifyTestScriptsTest
saveLoadAndModifyTestCasesTest
userFileHandlingTest
userOverwriteFileTest
testJobCreationTest
incomingFeedbacksTest
finalizeFeedbacksTest
deleteIncomingFeedbackTest
openSubmissionsTest
assessmentTests
unevaluatedScoresTests
scoreEvaluationTests
saveCommentNotificationTest
saveFeedbackNotificationTest
attachedSystemNotificationTest
attachedNotificationTest
test cleanUpPersistence | 993 | complexTests = group "Persistence Layer Complex tests" $ do
test initPersistenceLayer
userAssignmentKeyTests
courseOrGroupAssignmentTest
groupDescriptionTest
submissionDescTest
courseNameAndAdminsTest
submissionListDescTest
lastEvaluationTest
submissionDetailsDescTest
submissionTablesTest
userSubmissionDescTest
courseKeysTest
assignmentKeyTest
filterSubmissionsTest
modifyAssignmentsTest
modifyEvaluationTest
deleteUsersFromCourseTest
deleteUsersFromCourseNegativeTest
unsubscribeFromSubscribedGroupsTest
saveLoadAndModifyTestScriptsTest
saveLoadAndModifyTestCasesTest
userFileHandlingTest
userOverwriteFileTest
testJobCreationTest
incomingFeedbacksTest
finalizeFeedbacksTest
deleteIncomingFeedbackTest
openSubmissionsTest
assessmentTests
unevaluatedScoresTests
scoreEvaluationTests
saveCommentNotificationTest
saveFeedbackNotificationTest
attachedSystemNotificationTest
attachedNotificationTest
test cleanUpPersistence | 993 | complexTests = group "Persistence Layer Complex tests" $ do
test initPersistenceLayer
userAssignmentKeyTests
courseOrGroupAssignmentTest
groupDescriptionTest
submissionDescTest
courseNameAndAdminsTest
submissionListDescTest
lastEvaluationTest
submissionDetailsDescTest
submissionTablesTest
userSubmissionDescTest
courseKeysTest
assignmentKeyTest
filterSubmissionsTest
modifyAssignmentsTest
modifyEvaluationTest
deleteUsersFromCourseTest
deleteUsersFromCourseNegativeTest
unsubscribeFromSubscribedGroupsTest
saveLoadAndModifyTestScriptsTest
saveLoadAndModifyTestCasesTest
userFileHandlingTest
userOverwriteFileTest
testJobCreationTest
incomingFeedbacksTest
finalizeFeedbacksTest
deleteIncomingFeedbackTest
openSubmissionsTest
assessmentTests
unevaluatedScoresTests
scoreEvaluationTests
saveCommentNotificationTest
saveFeedbackNotificationTest
attachedSystemNotificationTest
attachedNotificationTest
test cleanUpPersistence | 993 | false | false | 0 | 8 | 118 | 127 | 44 | 83 | null | null |
wouwouwou/2017_module_8 | src/haskell/PP-project-2017/Checker.hs | apache-2.0 | getCheck (ASTProc _ _ _ mergedChecks) = mergedChecks | 55 | getCheck (ASTProc _ _ _ mergedChecks) = mergedChecks | 55 | getCheck (ASTProc _ _ _ mergedChecks) = mergedChecks | 55 | false | false | 0 | 6 | 10 | 22 | 10 | 12 | null | null |
seahug/pcph-scratch | src/Session5/State.hs | mit | (>=>) :: (a -> [b]) -> (b -> [c]) -> a -> [c]
f >=> g = \a -> let bs = f a
css = fmap g bs
in concat css | 140 | (>=>) :: (a -> [b]) -> (b -> [c]) -> a -> [c]
f >=> g = \a -> let bs = f a
css = fmap g bs
in concat css | 140 | f >=> g = \a -> let bs = f a
css = fmap g bs
in concat css | 94 | false | true | 0 | 11 | 67 | 87 | 45 | 42 | null | null |
lynnard/cocos2d-hs | src/Graphics/UI/Cocos2d/Event.hs | bsd-3-clause | eventMouse_getStartLocation :: (EventMouseValue arg'1) => arg'1 -> HoppyP.IO (V2 Float)
eventMouse_getStartLocation arg'1 =
withEventMousePtr arg'1 $ HoppyP.flip HoppyFHR.withCppPtr $ \arg'1' ->
(HoppyFHR.decodeAndDelete . M2.Vec2Const) =<<
(eventMouse_getStartLocation' arg'1') | 284 | eventMouse_getStartLocation :: (EventMouseValue arg'1) => arg'1 -> HoppyP.IO (V2 Float)
eventMouse_getStartLocation arg'1 =
withEventMousePtr arg'1 $ HoppyP.flip HoppyFHR.withCppPtr $ \arg'1' ->
(HoppyFHR.decodeAndDelete . M2.Vec2Const) =<<
(eventMouse_getStartLocation' arg'1') | 284 | eventMouse_getStartLocation arg'1 =
withEventMousePtr arg'1 $ HoppyP.flip HoppyFHR.withCppPtr $ \arg'1' ->
(HoppyFHR.decodeAndDelete . M2.Vec2Const) =<<
(eventMouse_getStartLocation' arg'1') | 196 | false | true | 0 | 10 | 32 | 82 | 41 | 41 | null | null |
anttisalonen/cgen | src/CppUtils.hs | bsd-3-clause | isStdType "double" = True | 25 | isStdType "double" = True | 25 | isStdType "double" = True | 25 | false | false | 0 | 5 | 3 | 9 | 4 | 5 | null | null |
nejla/nejla-common | tests/Persistent/Serializable.hs | bsd-3-clause | case_serializable_error :: IO ()
case_serializable_error =
withDB (serializableError False)
`shouldThrow` (\(ExceptionInLinkedThread _ mbE) ->
case Ex.fromException mbE of
Just (DBError mbPgError)
| Just e <- Ex.fromException mbPgError ->
Postgres.sqlState e == "40001"
_ -> throw mbE) | 396 | case_serializable_error :: IO ()
case_serializable_error =
withDB (serializableError False)
`shouldThrow` (\(ExceptionInLinkedThread _ mbE) ->
case Ex.fromException mbE of
Just (DBError mbPgError)
| Just e <- Ex.fromException mbPgError ->
Postgres.sqlState e == "40001"
_ -> throw mbE) | 396 | case_serializable_error =
withDB (serializableError False)
`shouldThrow` (\(ExceptionInLinkedThread _ mbE) ->
case Ex.fromException mbE of
Just (DBError mbPgError)
| Just e <- Ex.fromException mbPgError ->
Postgres.sqlState e == "40001"
_ -> throw mbE) | 363 | false | true | 0 | 17 | 146 | 111 | 52 | 59 | null | null |
mcmaniac/ghc | compiler/cmm/PprC.hs | bsd-3-clause | te_Static _ = return () | 23 | te_Static _ = return () | 23 | te_Static _ = return () | 23 | false | false | 0 | 6 | 4 | 14 | 6 | 8 | null | null |
alonho/bottle | src/Graphics/UI/Bottle/Widgets/Spacer.hs | gpl-3.0 | makeHorizontal :: Draw.R -> Sized Anim.Frame
makeHorizontal width = make (Vector2 width 0) | 90 | makeHorizontal :: Draw.R -> Sized Anim.Frame
makeHorizontal width = make (Vector2 width 0) | 90 | makeHorizontal width = make (Vector2 width 0) | 45 | false | true | 0 | 7 | 12 | 36 | 17 | 19 | null | null |
kmels/xmonad-launcher | XMonad/Prompt/Ssh.hs | bsd-3-clause | sshComplListGlobal :: IO [String]
sshComplListGlobal = do
env <- getEnv "SSH_KNOWN_HOSTS" `catch` econst "/nonexistent"
fs <- mapM fileExists [ env
, "/usr/local/etc/ssh/ssh_known_hosts"
, "/usr/local/etc/ssh_known_hosts"
, "/etc/ssh/ssh_known_hosts"
, "/etc/ssh_known_hosts"
]
case catMaybes fs of
[] -> return []
(f:_) -> sshComplListFile' f | 480 | sshComplListGlobal :: IO [String]
sshComplListGlobal = do
env <- getEnv "SSH_KNOWN_HOSTS" `catch` econst "/nonexistent"
fs <- mapM fileExists [ env
, "/usr/local/etc/ssh/ssh_known_hosts"
, "/usr/local/etc/ssh_known_hosts"
, "/etc/ssh/ssh_known_hosts"
, "/etc/ssh_known_hosts"
]
case catMaybes fs of
[] -> return []
(f:_) -> sshComplListFile' f | 480 | sshComplListGlobal = do
env <- getEnv "SSH_KNOWN_HOSTS" `catch` econst "/nonexistent"
fs <- mapM fileExists [ env
, "/usr/local/etc/ssh/ssh_known_hosts"
, "/usr/local/etc/ssh_known_hosts"
, "/etc/ssh/ssh_known_hosts"
, "/etc/ssh_known_hosts"
]
case catMaybes fs of
[] -> return []
(f:_) -> sshComplListFile' f | 446 | false | true | 0 | 11 | 177 | 102 | 51 | 51 | null | null |
bordaigorl/jamesbound | src/Language/PiCalc/Analysis/HTest.hs | gpl-2.0 | showTVar (NameType n) = show $ pretty n | 40 | showTVar (NameType n) = show $ pretty n | 40 | showTVar (NameType n) = show $ pretty n | 40 | false | false | 0 | 7 | 8 | 22 | 10 | 12 | null | null |
Philonous/d-bus | src/DBus/Wire.hs | mit | getEndian :: B.Get a -> B.Get a -> DBusGet a
getEndian l b = do
e <- ask
case e of
Little -> lift $ l
Big -> lift $ b | 143 | getEndian :: B.Get a -> B.Get a -> DBusGet a
getEndian l b = do
e <- ask
case e of
Little -> lift $ l
Big -> lift $ b | 143 | getEndian l b = do
e <- ask
case e of
Little -> lift $ l
Big -> lift $ b | 98 | false | true | 0 | 10 | 56 | 71 | 33 | 38 | null | null |
micknelso/language-c | src/Language/CFamily/System/Preprocess.hs | bsd-3-clause | preprocessedExt :: String
preprocessedExt = ".i" | 48 | preprocessedExt :: String
preprocessedExt = ".i" | 48 | preprocessedExt = ".i" | 22 | false | true | 0 | 6 | 5 | 18 | 7 | 11 | null | null |
oinuar/doppler-html | src/Doppler/Html/Types.hs | mit | mconcatContent [] =
[] | 25 | mconcatContent [] =
[] | 25 | mconcatContent [] =
[] | 25 | false | false | 0 | 5 | 6 | 14 | 6 | 8 | null | null |
mikeplus64/repl | src/Language/Haskell/Repl.hs | mit | parseExpr = Expr <$> getInput | 29 | parseExpr = Expr <$> getInput | 29 | parseExpr = Expr <$> getInput | 29 | false | false | 0 | 5 | 4 | 10 | 5 | 5 | null | null |
ingemaradahl/bilder | src/Compiler/Clean.hs | lgpl-3.0 | isNeeded ∷ [Stm] → Stm → State Dependencies [Stm]
isNeeded p stm = do
-- clean inner statements
stm' <- case stm of
-- ds, cs and ls need not be cleaned - cs and ls may only change variables declared in ds
(SFor ds cs ls ss) → SFor ds cs ls <$> foldM isNeeded [] (reverse ss)
-- some with e
(SWhile e ss) → SWhile e <$> foldM isNeeded [] (reverse ss)
(SDoWhile ss e) → SDoWhile <$> foldM isNeeded [] (reverse ss) <*> pure e
(SIf e ss) → SIf e <$> foldM isNeeded [] (reverse ss)
(SIfElse e trues falses) → SIfElse e <$> foldM isNeeded [] (reverse trues) <*> foldM isNeeded [] (reverse falses)
_ → return stm
let stmdeps = stmDeps stm'
deps ← get
if isReturn stm' || hasECall stm' || True `elem` [a `elem` deps | a ← affected stmdeps]
then do
mapM_ (uncurry addDeps) stmdeps
return $ stm':p
else return p
where
affected ∷ DepList → [Dep]
affected = map fst | 922 | isNeeded ∷ [Stm] → Stm → State Dependencies [Stm]
isNeeded p stm = do
-- clean inner statements
stm' <- case stm of
-- ds, cs and ls need not be cleaned - cs and ls may only change variables declared in ds
(SFor ds cs ls ss) → SFor ds cs ls <$> foldM isNeeded [] (reverse ss)
-- some with e
(SWhile e ss) → SWhile e <$> foldM isNeeded [] (reverse ss)
(SDoWhile ss e) → SDoWhile <$> foldM isNeeded [] (reverse ss) <*> pure e
(SIf e ss) → SIf e <$> foldM isNeeded [] (reverse ss)
(SIfElse e trues falses) → SIfElse e <$> foldM isNeeded [] (reverse trues) <*> foldM isNeeded [] (reverse falses)
_ → return stm
let stmdeps = stmDeps stm'
deps ← get
if isReturn stm' || hasECall stm' || True `elem` [a `elem` deps | a ← affected stmdeps]
then do
mapM_ (uncurry addDeps) stmdeps
return $ stm':p
else return p
where
affected ∷ DepList → [Dep]
affected = map fst | 922 | isNeeded p stm = do
-- clean inner statements
stm' <- case stm of
-- ds, cs and ls need not be cleaned - cs and ls may only change variables declared in ds
(SFor ds cs ls ss) → SFor ds cs ls <$> foldM isNeeded [] (reverse ss)
-- some with e
(SWhile e ss) → SWhile e <$> foldM isNeeded [] (reverse ss)
(SDoWhile ss e) → SDoWhile <$> foldM isNeeded [] (reverse ss) <*> pure e
(SIf e ss) → SIf e <$> foldM isNeeded [] (reverse ss)
(SIfElse e trues falses) → SIfElse e <$> foldM isNeeded [] (reverse trues) <*> foldM isNeeded [] (reverse falses)
_ → return stm
let stmdeps = stmDeps stm'
deps ← get
if isReturn stm' || hasECall stm' || True `elem` [a `elem` deps | a ← affected stmdeps]
then do
mapM_ (uncurry addDeps) stmdeps
return $ stm':p
else return p
where
affected ∷ DepList → [Dep]
affected = map fst | 872 | false | true | 0 | 15 | 238 | 392 | 190 | 202 | null | null |
michelk/yaml-overrides.hs | src/Data/Yaml/Union.hs | bsd-3-clause | -- | Decode multiple YAML strings and override fields recursively
decodeBytestrings
:: FromJSON a
=> [ByteString] -> Maybe a
decodeBytestrings = parseMaybe parseJSON . Object . unions . mapMaybe decode | 205 | decodeBytestrings
:: FromJSON a
=> [ByteString] -> Maybe a
decodeBytestrings = parseMaybe parseJSON . Object . unions . mapMaybe decode | 139 | decodeBytestrings = parseMaybe parseJSON . Object . unions . mapMaybe decode | 76 | true | true | 0 | 8 | 33 | 50 | 24 | 26 | null | null |
fibsifan/pandoc | src/Text/Pandoc/Writers/Docbook.hs | gpl-2.0 | -- | Convert an Element to Docbook.
elementToDocbook :: WriterOptions -> Int -> Element -> Doc
elementToDocbook opts _ (Blk block) = blockToDocbook opts block | 160 | elementToDocbook :: WriterOptions -> Int -> Element -> Doc
elementToDocbook opts _ (Blk block) = blockToDocbook opts block | 124 | elementToDocbook opts _ (Blk block) = blockToDocbook opts block | 65 | true | true | 0 | 7 | 26 | 42 | 21 | 21 | null | null |
Athas/Sindre | Sindre/X11.hs | mit | textExtents :: Xft.Font -> String -> SindreX11M (Int, Int)
textExtents font s = do dpy <- asks sindreDisplay
w <- io $ Xft.textWidth dpy font s
return (w, Xft.height font) | 220 | textExtents :: Xft.Font -> String -> SindreX11M (Int, Int)
textExtents font s = do dpy <- asks sindreDisplay
w <- io $ Xft.textWidth dpy font s
return (w, Xft.height font) | 220 | textExtents font s = do dpy <- asks sindreDisplay
w <- io $ Xft.textWidth dpy font s
return (w, Xft.height font) | 161 | false | true | 0 | 10 | 78 | 82 | 39 | 43 | null | null |
OS2World/DEV-UTIL-HUGS | oldlib/LeftistHeap.hs | bsd-3-clause | deleteMax :: Ord a => Heap a -> Heap a
deleteMax h = case maxView h of
Nothing2 -> E
Just2 h' x -> h' | 133 | deleteMax :: Ord a => Heap a -> Heap a
deleteMax h = case maxView h of
Nothing2 -> E
Just2 h' x -> h' | 133 | deleteMax h = case maxView h of
Nothing2 -> E
Just2 h' x -> h' | 94 | false | true | 0 | 8 | 56 | 55 | 25 | 30 | null | null |
tjakway/ghcjvm | compiler/prelude/PrelNames.hs | bsd-3-clause | floatDataConKey = mkPreludeDataConUnique 5 | 67 | floatDataConKey = mkPreludeDataConUnique 5 | 67 | floatDataConKey = mkPreludeDataConUnique 5 | 67 | false | false | 0 | 5 | 28 | 9 | 4 | 5 | null | null |
SiestaMadokaist/writescheme | src/Ramadoka/Parser/LispVal.hs | bsd-3-clause | showError (NumArgs expected found) = "Expected: " ++ show expected ++ "args; found values: " ++ stringify found | 111 | showError (NumArgs expected found) = "Expected: " ++ show expected ++ "args; found values: " ++ stringify found | 111 | showError (NumArgs expected found) = "Expected: " ++ show expected ++ "args; found values: " ++ stringify found | 111 | false | false | 0 | 8 | 17 | 35 | 16 | 19 | null | null |
bitemyapp/wreq | Network/Wreq.hs | bsd-3-clause | -- | Issue a DELETE request.
--
-- Example:
--
-- @
--'delete' \"http:\/\/httpbin.org\/delete\"
-- @
--
-- >>> r <- delete "http://httpbin.org/delete"
-- >>> r ^. responseStatus . statusCode
-- 200
delete :: String -> IO (Response L.ByteString)
delete = deleteWith defaults | 273 | delete :: String -> IO (Response L.ByteString)
delete = deleteWith defaults | 75 | delete = deleteWith defaults | 28 | true | true | 0 | 10 | 42 | 45 | 26 | 19 | null | null |
ruud-v-a/ruudvanasseldonk.com | src/Template.hs | gpl-3.0 | listField :: String -> [Context] -> Context
listField key values = Map.singleton key (ListValue values) | 103 | listField :: String -> [Context] -> Context
listField key values = Map.singleton key (ListValue values) | 103 | listField key values = Map.singleton key (ListValue values) | 59 | false | true | 0 | 7 | 14 | 40 | 20 | 20 | null | null |
SKA-ScienceDataProcessor/RC | MS2/lib/DNA/Controller.hs | apache-2.0 | stUsedResources :: Lens' StateACP (Map ProcessId VirtualCAD)
stUsedResources = lens _stUsedResources (\a x -> x { _stUsedResources = a}) | 136 | stUsedResources :: Lens' StateACP (Map ProcessId VirtualCAD)
stUsedResources = lens _stUsedResources (\a x -> x { _stUsedResources = a}) | 136 | stUsedResources = lens _stUsedResources (\a x -> x { _stUsedResources = a}) | 75 | false | true | 0 | 9 | 18 | 47 | 25 | 22 | null | null |
silverneko/haskell-playground | fixPlayground.hs | mit | leaf :: Tree a
leaf = fix LeafF | 31 | leaf :: Tree a
leaf = fix LeafF | 31 | leaf = fix LeafF | 16 | false | true | 1 | 5 | 7 | 20 | 8 | 12 | null | null |
spencerjanssen/text | Data/Text/Encoding/Error.hs | bsd-2-clause | -- | Replace an invalid input with a valid output.
replace :: b -> OnError a b
replace c _ _ = Just c | 101 | replace :: b -> OnError a b
replace c _ _ = Just c | 50 | replace c _ _ = Just c | 22 | true | true | 0 | 6 | 23 | 31 | 15 | 16 | null | null |
forked-upstream-packages-for-ghcjs/ghc | compiler/prelude/PrelNames.hs | bsd-3-clause | printIdKey = mkPreludeMiscIdUnique 37 | 56 | printIdKey = mkPreludeMiscIdUnique 37 | 56 | printIdKey = mkPreludeMiscIdUnique 37 | 56 | false | false | 0 | 5 | 22 | 9 | 4 | 5 | null | null |
fmthoma/ghc | compiler/prelude/PrelNames.hs | bsd-3-clause | mkThisGhcModule_ :: ModuleName -> Module
mkThisGhcModule_ m = mkModule thisGhcPackageKey m | 90 | mkThisGhcModule_ :: ModuleName -> Module
mkThisGhcModule_ m = mkModule thisGhcPackageKey m | 90 | mkThisGhcModule_ m = mkModule thisGhcPackageKey m | 49 | false | true | 0 | 5 | 10 | 23 | 11 | 12 | null | null |
simonced/haskell-kata | email-parser-stack/src/Lib.hs | gpl-3.0 | compareAllList :: [Email] -> [String]
compareAllList [x] = [] | 61 | compareAllList :: [Email] -> [String]
compareAllList [x] = [] | 61 | compareAllList [x] = [] | 23 | false | true | 0 | 8 | 8 | 35 | 17 | 18 | null | null |
bgold-cosmos/Tidal | src/Sound/Tidal/Params.hs | gpl-3.0 | overgainTake :: String -> [Double] -> ControlPattern
overgainTake name xs = pStateListF "overgain" name xs | 106 | overgainTake :: String -> [Double] -> ControlPattern
overgainTake name xs = pStateListF "overgain" name xs | 106 | overgainTake name xs = pStateListF "overgain" name xs | 53 | false | true | 0 | 8 | 14 | 42 | 18 | 24 | null | null |
j5b/ps-pc | TestUtils.hs | gpl-3.0 | exists_s = exists "S" | 21 | exists_s = exists "S" | 21 | exists_s = exists "S" | 21 | false | false | 0 | 5 | 3 | 9 | 4 | 5 | null | null |
codemac/yi-editor | src/Yi/Event.hs | gpl-2.0 | eventToChar (Event (KASCII c) mods) = (if MMeta `elem` mods then setMeta else id) $
(if MCtrl `elem` mods then ctrlLowcase else id) $
c | 211 | eventToChar (Event (KASCII c) mods) = (if MMeta `elem` mods then setMeta else id) $
(if MCtrl `elem` mods then ctrlLowcase else id) $
c | 211 | eventToChar (Event (KASCII c) mods) = (if MMeta `elem` mods then setMeta else id) $
(if MCtrl `elem` mods then ctrlLowcase else id) $
c | 211 | false | false | 0 | 9 | 100 | 65 | 37 | 28 | null | null |
agrafix/hackage-server | Distribution/Server/Packages/Types.hs | bsd-3-clause | pkgLatestRevision :: PkgInfo -> (CabalFileText, UploadInfo)
pkgLatestRevision = Vec.last . pkgMetadataRevisions | 111 | pkgLatestRevision :: PkgInfo -> (CabalFileText, UploadInfo)
pkgLatestRevision = Vec.last . pkgMetadataRevisions | 111 | pkgLatestRevision = Vec.last . pkgMetadataRevisions | 51 | false | true | 0 | 6 | 10 | 27 | 15 | 12 | null | null |
emk/haskell-probability-monads | examples/Probability.hs | bsd-3-clause | catPossible (Perhaps x p:phs) =
x:(catPossible phs) | 53 | catPossible (Perhaps x p:phs) =
x:(catPossible phs) | 53 | catPossible (Perhaps x p:phs) =
x:(catPossible phs) | 53 | false | false | 0 | 8 | 8 | 31 | 15 | 16 | null | null |
pascal-knodel/haskell-craft | _/links/E'7''1.hs | mit | {- GHCi>
firstIncremented [ 1 ]
-}
-- 2
-- Other solutions for "firstIncremented":
firstIncremented'3 :: [Integer] -> Integer
firstIncremented'3 [] = 0 | 159 | firstIncremented'3 :: [Integer] -> Integer
firstIncremented'3 [] = 0 | 69 | firstIncremented'3 [] = 0 | 26 | true | true | 0 | 6 | 30 | 26 | 15 | 11 | null | null |
chemist/highlighter | src/Text/Highlighter/Lexers/Logtalk.hs | bsd-3-clause | entityrelations' :: TokenMatcher
entityrelations' =
[ tok "(extends|i(nstantiates|mp(lements|orts))|specializes)(?=[(])" (Arbitrary "Keyword")
, tok "0'." (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0b[01]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0o[0-7]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0x[0-9a-fA-F]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "\\d+\\.?\\d*((e|E)(\\+|-)?\\d+)?" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "([A-Z_][a-zA-Z0-9_]*)" (Arbitrary "Name" :. Arbitrary "Variable")
, tok "[a-z][a-zA-Z0-9_]*" (Arbitrary "Text")
, tokNext "[']" (Arbitrary "Literal" :. Arbitrary "String") (GoTo quoted_atom')
, tok "\"(\\\\\\\\|\\\\\"|[^\"])*\"" (Arbitrary "Literal" :. Arbitrary "String")
, tokNext "([)]\\.)" (Arbitrary "Text") (GoTo root')
, tok "(::)" (Arbitrary "Operator")
, tok "[()\\[\\],.|]" (Arbitrary "Text")
, tok "%.*?\\n" (Arbitrary "Comment")
, tok "/\\*(.|\\n)*?\\*/" (Arbitrary "Comment")
, tok "\\n" (Arbitrary "Text")
, tok "\\s+" (Arbitrary "Text")
] | 1,104 | entityrelations' :: TokenMatcher
entityrelations' =
[ tok "(extends|i(nstantiates|mp(lements|orts))|specializes)(?=[(])" (Arbitrary "Keyword")
, tok "0'." (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0b[01]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0o[0-7]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0x[0-9a-fA-F]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "\\d+\\.?\\d*((e|E)(\\+|-)?\\d+)?" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "([A-Z_][a-zA-Z0-9_]*)" (Arbitrary "Name" :. Arbitrary "Variable")
, tok "[a-z][a-zA-Z0-9_]*" (Arbitrary "Text")
, tokNext "[']" (Arbitrary "Literal" :. Arbitrary "String") (GoTo quoted_atom')
, tok "\"(\\\\\\\\|\\\\\"|[^\"])*\"" (Arbitrary "Literal" :. Arbitrary "String")
, tokNext "([)]\\.)" (Arbitrary "Text") (GoTo root')
, tok "(::)" (Arbitrary "Operator")
, tok "[()\\[\\],.|]" (Arbitrary "Text")
, tok "%.*?\\n" (Arbitrary "Comment")
, tok "/\\*(.|\\n)*?\\*/" (Arbitrary "Comment")
, tok "\\n" (Arbitrary "Text")
, tok "\\s+" (Arbitrary "Text")
] | 1,104 | entityrelations' =
[ tok "(extends|i(nstantiates|mp(lements|orts))|specializes)(?=[(])" (Arbitrary "Keyword")
, tok "0'." (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0b[01]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0o[0-7]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "0x[0-9a-fA-F]+" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "\\d+\\.?\\d*((e|E)(\\+|-)?\\d+)?" (Arbitrary "Literal" :. Arbitrary "Number")
, tok "([A-Z_][a-zA-Z0-9_]*)" (Arbitrary "Name" :. Arbitrary "Variable")
, tok "[a-z][a-zA-Z0-9_]*" (Arbitrary "Text")
, tokNext "[']" (Arbitrary "Literal" :. Arbitrary "String") (GoTo quoted_atom')
, tok "\"(\\\\\\\\|\\\\\"|[^\"])*\"" (Arbitrary "Literal" :. Arbitrary "String")
, tokNext "([)]\\.)" (Arbitrary "Text") (GoTo root')
, tok "(::)" (Arbitrary "Operator")
, tok "[()\\[\\],.|]" (Arbitrary "Text")
, tok "%.*?\\n" (Arbitrary "Comment")
, tok "/\\*(.|\\n)*?\\*/" (Arbitrary "Comment")
, tok "\\n" (Arbitrary "Text")
, tok "\\s+" (Arbitrary "Text")
] | 1,071 | false | true | 0 | 9 | 190 | 321 | 157 | 164 | null | null |
hguenther/smtlib2 | Language/SMTLib2/Internals/Type/Struct.hs | gpl-3.0 | mapM f (Struct xs) = do
nxs <- List.mapM (mapM f) xs
return (Struct nxs) | 76 | mapM f (Struct xs) = do
nxs <- List.mapM (mapM f) xs
return (Struct nxs) | 76 | mapM f (Struct xs) = do
nxs <- List.mapM (mapM f) xs
return (Struct nxs) | 76 | false | false | 0 | 10 | 18 | 49 | 22 | 27 | null | null |
rolph-recto/liquidhaskell | src/Language/Haskell/Liquid/FaultLocal.hs | bsd-3-clause | exprWeight (Let (NonRec _ arg) body) =
(exprWeight arg) + (exprWeight body) + 1 | 81 | exprWeight (Let (NonRec _ arg) body) =
(exprWeight arg) + (exprWeight body) + 1 | 81 | exprWeight (Let (NonRec _ arg) body) =
(exprWeight arg) + (exprWeight body) + 1 | 81 | false | false | 2 | 8 | 15 | 48 | 22 | 26 | null | null |
Lykos/Sara | src/lib/Sara/Z3/SymbolicExecutor.hs | gpl-3.0 | symbolicExecuteImpure (Sy.Variable _ m _ _) = return m | 95 | symbolicExecuteImpure (Sy.Variable _ m _ _) = return m | 95 | symbolicExecuteImpure (Sy.Variable _ m _ _) = return m | 95 | false | false | 0 | 8 | 49 | 26 | 12 | 14 | null | null |
larioj/nemo | src/Read.hs | mit | selectSources :: [FilePath] -> [NemoPath] -> [NemoPath]
selectSources specs sources =
removeIgnoredNemoPaths specs $
selectSupportedNemoPaths sources | 157 | selectSources :: [FilePath] -> [NemoPath] -> [NemoPath]
selectSources specs sources =
removeIgnoredNemoPaths specs $
selectSupportedNemoPaths sources | 157 | selectSources specs sources =
removeIgnoredNemoPaths specs $
selectSupportedNemoPaths sources | 101 | false | true | 0 | 7 | 23 | 43 | 22 | 21 | null | null |
ekarayel/HTF | Test/Framework/TestReporter.hs | lgpl-2.1 | reportAllTestsH :: ReportAllTests
reportAllTestsH l =
reportStringTR Info (render (renderTestNames l)) | 106 | reportAllTestsH :: ReportAllTests
reportAllTestsH l =
reportStringTR Info (render (renderTestNames l)) | 106 | reportAllTestsH l =
reportStringTR Info (render (renderTestNames l)) | 72 | false | true | 0 | 9 | 14 | 31 | 15 | 16 | null | null |
droundy/franchise | Distribution/Franchise/HaskellPolicy.hs | bsd-3-clause | isHaskell :: FilePath -> Bool
isHaskell x | ".preproc/" `isPrefixOf` x = False | 78 | isHaskell :: FilePath -> Bool
isHaskell x | ".preproc/" `isPrefixOf` x = False | 78 | isHaskell x | ".preproc/" `isPrefixOf` x = False | 48 | false | true | 0 | 8 | 12 | 36 | 16 | 20 | null | null |
martin-kolinek/some-board-game | src/Player/Building/Style.hs | mit | smallBuildingTypeCss Passage = background (url "data/passage.svg") | 66 | smallBuildingTypeCss Passage = background (url "data/passage.svg") | 66 | smallBuildingTypeCss Passage = background (url "data/passage.svg") | 66 | false | false | 0 | 7 | 5 | 18 | 8 | 10 | null | null |
wavewave/hxournal | lib/Application/HXournal/Coroutine/Default.hs | bsd-2-clause | menuEventProcess MenuDelete = deleteSelection | 45 | menuEventProcess MenuDelete = deleteSelection | 45 | menuEventProcess MenuDelete = deleteSelection | 45 | false | false | 0 | 5 | 3 | 9 | 4 | 5 | null | null |
glutamate/cmdtheline | doc/examples/FizzBuzz.hs | mit | verbosity :: Term Verbosity
verbosity = lastOf $ vFlagAll [Normal] [ ( Verbose, verbose )
, ( Silent, silent )
]
where
verbose =(optInfo [ "verbose", "v" ])
{ optDoc = "Give verbose output." }
silent =(optInfo [ "quiet", "silent", "q", "s" ])
{ optDoc = "Provide no output." } | 386 | verbosity :: Term Verbosity
verbosity = lastOf $ vFlagAll [Normal] [ ( Verbose, verbose )
, ( Silent, silent )
]
where
verbose =(optInfo [ "verbose", "v" ])
{ optDoc = "Give verbose output." }
silent =(optInfo [ "quiet", "silent", "q", "s" ])
{ optDoc = "Provide no output." } | 386 | verbosity = lastOf $ vFlagAll [Normal] [ ( Verbose, verbose )
, ( Silent, silent )
]
where
verbose =(optInfo [ "verbose", "v" ])
{ optDoc = "Give verbose output." }
silent =(optInfo [ "quiet", "silent", "q", "s" ])
{ optDoc = "Provide no output." } | 358 | false | true | 0 | 8 | 159 | 103 | 60 | 43 | null | null |
christiaanb/ghc | compiler/main/HscTypes.hs | bsd-3-clause | -- For data cons add the worker and (possibly) wrapper
implicitConLikeThings (PatSynCon {})
= [] | 99 | implicitConLikeThings (PatSynCon {})
= [] | 43 | implicitConLikeThings (PatSynCon {})
= [] | 43 | true | false | 0 | 6 | 17 | 20 | 10 | 10 | null | null |
haskell/filepath | System/FilePath/Internal.hs | bsd-3-clause | {- c:\ -}
readDriveLetter :: String -> Maybe (FilePath, FilePath)
readDriveLetter (x:':':y:xs) | isLetter x && isPathSeparator y = Just $ addSlash [x,':'] (y:xs) | 161 | readDriveLetter :: String -> Maybe (FilePath, FilePath)
readDriveLetter (x:':':y:xs) | isLetter x && isPathSeparator y = Just $ addSlash [x,':'] (y:xs) | 151 | readDriveLetter (x:':':y:xs) | isLetter x && isPathSeparator y = Just $ addSlash [x,':'] (y:xs) | 95 | true | true | 0 | 9 | 23 | 85 | 42 | 43 | null | null |
beni55/Midi | src/Music.hs | bsd-3-clause | pitch :: Word8 -> SimpleMusic Note
pitch n = Mel [(1, n+60)] | 60 | pitch :: Word8 -> SimpleMusic Note
pitch n = Mel [(1, n+60)] | 60 | pitch n = Mel [(1, n+60)] | 25 | false | true | 0 | 8 | 11 | 37 | 19 | 18 | null | null |
JacquesCarette/literate-scientific-software | code/drasil-printers/Language/Drasil/Plain/Print.hs | bsd-2-clause | pExprDoc f (Font Bold e) = pExprDoc f e <> text "_vect" | 55 | pExprDoc f (Font Bold e) = pExprDoc f e <> text "_vect" | 55 | pExprDoc f (Font Bold e) = pExprDoc f e <> text "_vect" | 55 | false | false | 0 | 7 | 11 | 31 | 14 | 17 | null | null |
pjones/xmonad-test | vendor/xmonad-contrib/XMonad/Layout/Master.hs | bsd-2-clause | fixMastered :: (LayoutClass l a) =>
Rational -- ^ @delta@, the ratio of the screen to resize by
-> Rational -- ^ @frac@, what portion of the screen to use for the master window
-> l a -- ^ the layout to be modified
-> ModifiedLayout FixMaster l a
fixMastered delta frac = ModifiedLayout . FixMaster $ AddMaster 1 delta frac | 347 | fixMastered :: (LayoutClass l a) =>
Rational -- ^ @delta@, the ratio of the screen to resize by
-> Rational -- ^ @frac@, what portion of the screen to use for the master window
-> l a -- ^ the layout to be modified
-> ModifiedLayout FixMaster l a
fixMastered delta frac = ModifiedLayout . FixMaster $ AddMaster 1 delta frac | 347 | fixMastered delta frac = ModifiedLayout . FixMaster $ AddMaster 1 delta frac | 76 | false | true | 0 | 10 | 84 | 68 | 34 | 34 | null | null |
eniac314/wizzard | src/main.hs | gpl-3.0 | main =
do initializeAll
HintRenderScaleQuality $= ScaleLinear
renderQuality <- get HintRenderScaleQuality
when (renderQuality /= ScaleLinear) $
putStrLn "Warning: Linear texture filtering not enabled!"
window <- createWindow (Text.pack "Wizzard 0.1") initWindow
--scr <- createRenderer window (-1) vsyncRendererConfig
scr <- createRenderer window (-1) defaultRenderer
rendererDrawColor scr $= V4 0 0 0 0
gen <- getStdGen
let --go w = addThings w [(15,15,Building SmallCastle2),(45,25,Building SmallCastle2)]
(seed,_) = random gen
--(seed,_) = random.mkStdGen $ 12
--initial tile vector
land = makeLand chunkType nbrPts seed
--width/height of displayed canvas (in tiles)
canSize = 20
(plX,plY) = let off = (div nbrPts 2) in (off,off)
--Canvas origin position in chunk
(canPosX,canPosY) = (plX - (div canSize 2),plY - (div canSize 2))
args <- getArgs
tilesData <- loadTexture scr "./images/bigAlphaTiles.gif"
fmv <- newEmptyMVar
putMVar fmv False
bmv <- newEmptyMVar
let !system = Sys screenwidth screenheight seed fmv bmv
!current = Chunk chunkType (canPosX,canPosY) land (canSize,canSize) nbrPts 0
!player' = Avatar (plX,plY) maje Stop
!world = (addVarious seed).addBorders $ World system scr tilesData current [] player'
--forkIO $ threadedChunk world bmv fmv
let loop w =
do let (t,s) = (tileset w, screen w)
(ch,(canX,canY)) = (chunk $ w, getCanvasPos $ w)
(wid,hei) = (width.sys $ w, height.sys $ w)
(fmv,bmv) = (flagMVar.sys $ w, boxMVar.sys $ w)
start <- ticks
--flag <- readMVar fmv
--if flag then putStrLn "Done!" else putStrLn "not Yet!"
--content <- tryTakeMVar bmv
--case content of
-- Nothing -> putStrLn "Empty" -- >> return w
-- Just c -> putStrLn "Good!!!!!!!!!!!!!!!!!!!!!!" -- >> (return $ w {chunk = ((chunk w){chLand = c})})
{- Rendering -}
clear s
applyTileMat w
applyPlayer w
present s
{- World Update -}
let nextFrames = updateTail.updatePlayerTiles
let w' = moveCamera.movePlayer.nextFrames $ w
event <- pollEvent
{- Fps cap -}
stop <-ticks
let del = (timeDelay start stop)
unless (del == 0) (delay del)
--printPlayerData w'
case event of
Nothing -> loop $ changeDir w' Stop
Just e ->
case eventPayload e of
QuitEvent -> return ()
KeyboardEvent (KeyboardEventData _ _ _ (Keysym _ kc _)) ->
case kc of KeycodeLeft -> loop $ changeDir w' Lefty
KeycodeRight -> loop $ changeDir w' Righty
KeycodeUp -> loop $ changeDir w' Up
KeycodeDown -> loop $ changeDir w' Down
KeycodeEscape -> return ()
_ -> loop w'
_ -> loop w'
loop world
destroyRenderer scr
destroyWindow window
quit | 3,478 | main =
do initializeAll
HintRenderScaleQuality $= ScaleLinear
renderQuality <- get HintRenderScaleQuality
when (renderQuality /= ScaleLinear) $
putStrLn "Warning: Linear texture filtering not enabled!"
window <- createWindow (Text.pack "Wizzard 0.1") initWindow
--scr <- createRenderer window (-1) vsyncRendererConfig
scr <- createRenderer window (-1) defaultRenderer
rendererDrawColor scr $= V4 0 0 0 0
gen <- getStdGen
let --go w = addThings w [(15,15,Building SmallCastle2),(45,25,Building SmallCastle2)]
(seed,_) = random gen
--(seed,_) = random.mkStdGen $ 12
--initial tile vector
land = makeLand chunkType nbrPts seed
--width/height of displayed canvas (in tiles)
canSize = 20
(plX,plY) = let off = (div nbrPts 2) in (off,off)
--Canvas origin position in chunk
(canPosX,canPosY) = (plX - (div canSize 2),plY - (div canSize 2))
args <- getArgs
tilesData <- loadTexture scr "./images/bigAlphaTiles.gif"
fmv <- newEmptyMVar
putMVar fmv False
bmv <- newEmptyMVar
let !system = Sys screenwidth screenheight seed fmv bmv
!current = Chunk chunkType (canPosX,canPosY) land (canSize,canSize) nbrPts 0
!player' = Avatar (plX,plY) maje Stop
!world = (addVarious seed).addBorders $ World system scr tilesData current [] player'
--forkIO $ threadedChunk world bmv fmv
let loop w =
do let (t,s) = (tileset w, screen w)
(ch,(canX,canY)) = (chunk $ w, getCanvasPos $ w)
(wid,hei) = (width.sys $ w, height.sys $ w)
(fmv,bmv) = (flagMVar.sys $ w, boxMVar.sys $ w)
start <- ticks
--flag <- readMVar fmv
--if flag then putStrLn "Done!" else putStrLn "not Yet!"
--content <- tryTakeMVar bmv
--case content of
-- Nothing -> putStrLn "Empty" -- >> return w
-- Just c -> putStrLn "Good!!!!!!!!!!!!!!!!!!!!!!" -- >> (return $ w {chunk = ((chunk w){chLand = c})})
{- Rendering -}
clear s
applyTileMat w
applyPlayer w
present s
{- World Update -}
let nextFrames = updateTail.updatePlayerTiles
let w' = moveCamera.movePlayer.nextFrames $ w
event <- pollEvent
{- Fps cap -}
stop <-ticks
let del = (timeDelay start stop)
unless (del == 0) (delay del)
--printPlayerData w'
case event of
Nothing -> loop $ changeDir w' Stop
Just e ->
case eventPayload e of
QuitEvent -> return ()
KeyboardEvent (KeyboardEventData _ _ _ (Keysym _ kc _)) ->
case kc of KeycodeLeft -> loop $ changeDir w' Lefty
KeycodeRight -> loop $ changeDir w' Righty
KeycodeUp -> loop $ changeDir w' Up
KeycodeDown -> loop $ changeDir w' Down
KeycodeEscape -> return ()
_ -> loop w'
_ -> loop w'
loop world
destroyRenderer scr
destroyWindow window
quit | 3,478 | main =
do initializeAll
HintRenderScaleQuality $= ScaleLinear
renderQuality <- get HintRenderScaleQuality
when (renderQuality /= ScaleLinear) $
putStrLn "Warning: Linear texture filtering not enabled!"
window <- createWindow (Text.pack "Wizzard 0.1") initWindow
--scr <- createRenderer window (-1) vsyncRendererConfig
scr <- createRenderer window (-1) defaultRenderer
rendererDrawColor scr $= V4 0 0 0 0
gen <- getStdGen
let --go w = addThings w [(15,15,Building SmallCastle2),(45,25,Building SmallCastle2)]
(seed,_) = random gen
--(seed,_) = random.mkStdGen $ 12
--initial tile vector
land = makeLand chunkType nbrPts seed
--width/height of displayed canvas (in tiles)
canSize = 20
(plX,plY) = let off = (div nbrPts 2) in (off,off)
--Canvas origin position in chunk
(canPosX,canPosY) = (plX - (div canSize 2),plY - (div canSize 2))
args <- getArgs
tilesData <- loadTexture scr "./images/bigAlphaTiles.gif"
fmv <- newEmptyMVar
putMVar fmv False
bmv <- newEmptyMVar
let !system = Sys screenwidth screenheight seed fmv bmv
!current = Chunk chunkType (canPosX,canPosY) land (canSize,canSize) nbrPts 0
!player' = Avatar (plX,plY) maje Stop
!world = (addVarious seed).addBorders $ World system scr tilesData current [] player'
--forkIO $ threadedChunk world bmv fmv
let loop w =
do let (t,s) = (tileset w, screen w)
(ch,(canX,canY)) = (chunk $ w, getCanvasPos $ w)
(wid,hei) = (width.sys $ w, height.sys $ w)
(fmv,bmv) = (flagMVar.sys $ w, boxMVar.sys $ w)
start <- ticks
--flag <- readMVar fmv
--if flag then putStrLn "Done!" else putStrLn "not Yet!"
--content <- tryTakeMVar bmv
--case content of
-- Nothing -> putStrLn "Empty" -- >> return w
-- Just c -> putStrLn "Good!!!!!!!!!!!!!!!!!!!!!!" -- >> (return $ w {chunk = ((chunk w){chLand = c})})
{- Rendering -}
clear s
applyTileMat w
applyPlayer w
present s
{- World Update -}
let nextFrames = updateTail.updatePlayerTiles
let w' = moveCamera.movePlayer.nextFrames $ w
event <- pollEvent
{- Fps cap -}
stop <-ticks
let del = (timeDelay start stop)
unless (del == 0) (delay del)
--printPlayerData w'
case event of
Nothing -> loop $ changeDir w' Stop
Just e ->
case eventPayload e of
QuitEvent -> return ()
KeyboardEvent (KeyboardEventData _ _ _ (Keysym _ kc _)) ->
case kc of KeycodeLeft -> loop $ changeDir w' Lefty
KeycodeRight -> loop $ changeDir w' Righty
KeycodeUp -> loop $ changeDir w' Up
KeycodeDown -> loop $ changeDir w' Down
KeycodeEscape -> return ()
_ -> loop w'
_ -> loop w'
loop world
destroyRenderer scr
destroyWindow window
quit | 3,478 | false | false | 4 | 15 | 1,372 | 807 | 404 | 403 | null | null |
daleooo/barrelfish | tools/mackerel/CSyntax.hs | mit | union :: String -> [ String ] -> [ String ]
union name fields = structunion "union" name fields | 96 | union :: String -> [ String ] -> [ String ]
union name fields = structunion "union" name fields | 96 | union name fields = structunion "union" name fields | 52 | false | true | 0 | 7 | 19 | 37 | 19 | 18 | null | null |
d0kt0r0/Tidal | src/Sound/Tidal/Core.hs | gpl-3.0 | -- | Equal power reversed
envEqR :: Pattern Double
envEqR = sig $ \t -> sqrt (cos (pi/2 * max 0 (min (fromRational (1-t)) 1))) | 126 | envEqR :: Pattern Double
envEqR = sig $ \t -> sqrt (cos (pi/2 * max 0 (min (fromRational (1-t)) 1))) | 100 | envEqR = sig $ \t -> sqrt (cos (pi/2 * max 0 (min (fromRational (1-t)) 1))) | 75 | true | true | 3 | 17 | 24 | 74 | 36 | 38 | null | null |
snowleopard/shaking-up-ghc | src/CommandLine.hs | bsd-3-clause | readTestWay :: Maybe String -> Either String (CommandLineArgs -> CommandLineArgs)
readTestWay way =
case way of
Nothing -> Right id
Just way -> Right $ \flags ->
let newWays = way : testWays (testArgs flags)
in flags { testArgs = (testArgs flags) {testWays = newWays} }
-- | Standard 'OptDescr' descriptions of Hadrian's command line arguments. | 389 | readTestWay :: Maybe String -> Either String (CommandLineArgs -> CommandLineArgs)
readTestWay way =
case way of
Nothing -> Right id
Just way -> Right $ \flags ->
let newWays = way : testWays (testArgs flags)
in flags { testArgs = (testArgs flags) {testWays = newWays} }
-- | Standard 'OptDescr' descriptions of Hadrian's command line arguments. | 389 | readTestWay way =
case way of
Nothing -> Right id
Just way -> Right $ \flags ->
let newWays = way : testWays (testArgs flags)
in flags { testArgs = (testArgs flags) {testWays = newWays} }
-- | Standard 'OptDescr' descriptions of Hadrian's command line arguments. | 307 | false | true | 0 | 17 | 100 | 111 | 56 | 55 | null | null |
facebookincubator/duckling | Duckling/Numeral/ES/Rules.hs | bsd-3-clause | ruleNumeralThousandsAnd :: Rule
ruleNumeralThousandsAnd = Rule
{ name = "<thousands> 0..999"
, pattern =
[ numberWith TNumeral.value (TNumeral.isMultiple 1000)
, numberBetween 0 999
]
, prod = \case
(Token Numeral NumeralData { TNumeral.value = v1 } : Token Numeral NumeralData { TNumeral.value = v2 } : _)
| 0 < v1 && v1 < 1000000 -> double $ v1 + v2
_ -> Nothing
} | 411 | ruleNumeralThousandsAnd :: Rule
ruleNumeralThousandsAnd = Rule
{ name = "<thousands> 0..999"
, pattern =
[ numberWith TNumeral.value (TNumeral.isMultiple 1000)
, numberBetween 0 999
]
, prod = \case
(Token Numeral NumeralData { TNumeral.value = v1 } : Token Numeral NumeralData { TNumeral.value = v2 } : _)
| 0 < v1 && v1 < 1000000 -> double $ v1 + v2
_ -> Nothing
} | 411 | ruleNumeralThousandsAnd = Rule
{ name = "<thousands> 0..999"
, pattern =
[ numberWith TNumeral.value (TNumeral.isMultiple 1000)
, numberBetween 0 999
]
, prod = \case
(Token Numeral NumeralData { TNumeral.value = v1 } : Token Numeral NumeralData { TNumeral.value = v2 } : _)
| 0 < v1 && v1 < 1000000 -> double $ v1 + v2
_ -> Nothing
} | 379 | false | true | 0 | 17 | 109 | 150 | 75 | 75 | null | null |
rueshyna/gogol | gogol-compute/gen/Network/Google/Resource/Compute/RegionInstanceGroups/ListInstances.hs | mpl-2.0 | -- | Sets a filter expression for filtering listed resources, in the form
-- filter={expression}. Your {expression} must be in the format: field_name
-- comparison_string literal_string. The field_name is the name of the
-- field you want to compare. Only atomic field types are supported
-- (string, number, boolean). The comparison_string must be either eq
-- (equals) or ne (not equals). The literal_string is the string value to
-- filter to. The literal value must be valid for the type of field you are
-- filtering by (string, number, boolean). For string fields, the literal
-- value is interpreted as a regular expression using RE2 syntax. The
-- literal value must match the entire field. For example, to filter for
-- instances that do not have a name of example-instance, you would use
-- filter=name ne example-instance. You can filter on nested fields. For
-- example, you could filter on instances that have set the
-- scheduling.automaticRestart field to true. Use filtering on nested
-- fields to take advantage of labels to organize and search for results
-- based on label values. To filter on multiple expressions, provide each
-- separate expression within parentheses. For example,
-- (scheduling.automaticRestart eq true) (zone eq us-central1-f). Multiple
-- expressions are treated as AND expressions, meaning that resources must
-- match all expressions to pass the filters.
rigliFilter :: Lens' RegionInstanceGroupsListInstances' (Maybe Text)
rigliFilter
= lens _rigliFilter (\ s a -> s{_rigliFilter = a}) | 1,533 | rigliFilter :: Lens' RegionInstanceGroupsListInstances' (Maybe Text)
rigliFilter
= lens _rigliFilter (\ s a -> s{_rigliFilter = a}) | 133 | rigliFilter
= lens _rigliFilter (\ s a -> s{_rigliFilter = a}) | 64 | true | true | 0 | 9 | 241 | 67 | 44 | 23 | null | null |
tokiwoousaka/egison4 | hs-src/Language/Egison/Parser.hs | mit | keywordLet = reserved "let" | 34 | keywordLet = reserved "let" | 34 | keywordLet = reserved "let" | 34 | false | false | 0 | 5 | 10 | 9 | 4 | 5 | null | null |
da-x/buildsome-tst | src/Lib/Makefile/CondState.hs | bsd-3-clause | nest _ condState@CondState{..} =
condState { falseNesting = falseNesting + 1 } | 80 | nest _ condState@CondState{..} =
condState { falseNesting = falseNesting + 1 } | 80 | nest _ condState@CondState{..} =
condState { falseNesting = falseNesting + 1 } | 80 | false | false | 0 | 8 | 13 | 39 | 19 | 20 | null | null |
michaelbeaumont/hatic | hatic.hs | bsd-3-clause | parseArgs config ("-p":value:ss) = Settings (address config) value
(persistFile config) | 123 | parseArgs config ("-p":value:ss) = Settings (address config) value
(persistFile config) | 123 | parseArgs config ("-p":value:ss) = Settings (address config) value
(persistFile config) | 123 | false | false | 0 | 8 | 45 | 41 | 20 | 21 | null | null |
mcschroeder/ghc | compiler/cmm/CLabel.hs | bsd-3-clause | pprCLbl (RtsLabel (RtsApFast str)) = ftext str <> text "_fast" | 64 | pprCLbl (RtsLabel (RtsApFast str)) = ftext str <> text "_fast" | 64 | pprCLbl (RtsLabel (RtsApFast str)) = ftext str <> text "_fast" | 64 | false | false | 0 | 8 | 11 | 32 | 14 | 18 | null | null |
spechub/Hets | OWL2/AS.hs | gpl-2.0 | getVariablesFromAtom :: Atom -> Set.Set Variable
getVariablesFromAtom atom = case atom of
ClassAtom _ (IVar var) -> Set.singleton var
DataRangeAtom _ (DVar var) -> Set.singleton var
ObjectPropertyAtom _ iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
DataPropertyAtom _ iarg darg -> getVariablesFromDArg darg `Set.union` getVariablesFromIArg iarg
BuiltInAtom _ args -> Set.unions $ getVariablesFromDArg <$> args
SameIndividualAtom iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
DifferentIndividualsAtom iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
_ -> mempty | 656 | getVariablesFromAtom :: Atom -> Set.Set Variable
getVariablesFromAtom atom = case atom of
ClassAtom _ (IVar var) -> Set.singleton var
DataRangeAtom _ (DVar var) -> Set.singleton var
ObjectPropertyAtom _ iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
DataPropertyAtom _ iarg darg -> getVariablesFromDArg darg `Set.union` getVariablesFromIArg iarg
BuiltInAtom _ args -> Set.unions $ getVariablesFromDArg <$> args
SameIndividualAtom iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
DifferentIndividualsAtom iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
_ -> mempty | 656 | getVariablesFromAtom atom = case atom of
ClassAtom _ (IVar var) -> Set.singleton var
DataRangeAtom _ (DVar var) -> Set.singleton var
ObjectPropertyAtom _ iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
DataPropertyAtom _ iarg darg -> getVariablesFromDArg darg `Set.union` getVariablesFromIArg iarg
BuiltInAtom _ args -> Set.unions $ getVariablesFromDArg <$> args
SameIndividualAtom iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
DifferentIndividualsAtom iarg1 iarg2 -> Set.unions $ getVariablesFromIArg <$> [iarg1, iarg2]
_ -> mempty | 607 | false | true | 12 | 8 | 111 | 166 | 92 | 74 | null | null |
talanis85/mudblood | src/Mudblood/Contrib/MG/Mapper/Hash.hs | gpl-3.0 | guardCurrentHash :: String -> a -> MBTrigger u a
guardCurrentHash hash = keep1 (const (checkCurrentHash hash) >=> guard) | 120 | guardCurrentHash :: String -> a -> MBTrigger u a
guardCurrentHash hash = keep1 (const (checkCurrentHash hash) >=> guard) | 120 | guardCurrentHash hash = keep1 (const (checkCurrentHash hash) >=> guard) | 71 | false | true | 0 | 10 | 17 | 50 | 23 | 27 | null | null |
abuiles/turbinado-blog | tmp/dependencies/haskell-src-exts-0.3.9/Language/Haskell/Exts/Pretty.hs | bsd-3-clause | braces d = d >>= return . P.braces | 34 | braces d = d >>= return . P.braces | 34 | braces d = d >>= return . P.braces | 34 | false | false | 0 | 6 | 7 | 19 | 9 | 10 | null | null |
didmar/helm | tests/Main.hs | mit | main :: IO ()
main = defaultMain [testGroup "Color" Color.tests,
testGroup "Time" Time.tests] | 113 | main :: IO ()
main = defaultMain [testGroup "Color" Color.tests,
testGroup "Time" Time.tests] | 113 | main = defaultMain [testGroup "Color" Color.tests,
testGroup "Time" Time.tests] | 99 | false | true | 0 | 8 | 32 | 39 | 19 | 20 | null | null |
maciej-bendkowski/boltzmann-brain | Data/Boltzmann/System/Utils.hs | bsd-3-clause | -- | Evaluates the given system Y = H(Z, Y) at coordinates
-- Z = 0 and Y = 0 and checks if the outcome system is empty,
-- i.e. H(0, 0) = 0 or not.
isEmptyAtZero :: (Eq a, Num a) => System a -> Bool
isEmptyAtZero sys = all isZeroType ts
where ts = M.toList $ defs sys
isZeroType (_, consL) = all isZeroCons consL
-- Note: A given constructor can give a non-zero coordinate
-- iff it has no arguments and no positive weight. List
-- arguments are irrelevant as they yield powers of unity.
isZeroCons cons = not $ weight cons == 0 && null (args cons) | 620 | isEmptyAtZero :: (Eq a, Num a) => System a -> Bool
isEmptyAtZero sys = all isZeroType ts
where ts = M.toList $ defs sys
isZeroType (_, consL) = all isZeroCons consL
-- Note: A given constructor can give a non-zero coordinate
-- iff it has no arguments and no positive weight. List
-- arguments are irrelevant as they yield powers of unity.
isZeroCons cons = not $ weight cons == 0 && null (args cons) | 467 | isEmptyAtZero sys = all isZeroType ts
where ts = M.toList $ defs sys
isZeroType (_, consL) = all isZeroCons consL
-- Note: A given constructor can give a non-zero coordinate
-- iff it has no arguments and no positive weight. List
-- arguments are irrelevant as they yield powers of unity.
isZeroCons cons = not $ weight cons == 0 && null (args cons) | 416 | true | true | 2 | 10 | 181 | 114 | 59 | 55 | null | null |
kawamuray/ganeti | src/Ganeti/Constants.hs | gpl-2.0 | sshsSshRootKey :: String
sshsSshRootKey = "ssh_root_key" | 56 | sshsSshRootKey :: String
sshsSshRootKey = "ssh_root_key" | 56 | sshsSshRootKey = "ssh_root_key" | 31 | false | true | 0 | 4 | 5 | 11 | 6 | 5 | null | null |
shlevy/ghc | compiler/prelude/PrelNames.hs | bsd-3-clause | returnM_RDR = nameRdrName returnMName | 49 | returnM_RDR = nameRdrName returnMName | 49 | returnM_RDR = nameRdrName returnMName | 49 | false | false | 0 | 5 | 15 | 9 | 4 | 5 | null | null |
rueshyna/gogol | gogol-servicemanagement/gen/Network/Google/ServiceManagement/Types/Product.hs | mpl-2.0 | -- | An operator to apply the subject with.
cOp :: Lens' Condition (Maybe ConditionOp)
cOp = lens _cOp (\ s a -> s{_cOp = a}) | 125 | cOp :: Lens' Condition (Maybe ConditionOp)
cOp = lens _cOp (\ s a -> s{_cOp = a}) | 81 | cOp = lens _cOp (\ s a -> s{_cOp = a}) | 38 | true | true | 0 | 9 | 25 | 46 | 25 | 21 | null | null |
mcschroeder/ghc | compiler/prelude/TysWiredIn.hs | bsd-3-clause | mkWiredInDataConName :: BuiltInSyntax -> Module -> FastString -> Unique -> DataCon -> Name
mkWiredInDataConName built_in modu fs unique datacon
= mkWiredInName modu (mkDataOccFS fs) unique
(AConLike (RealDataCon datacon)) -- Relevant DataCon
built_in | 291 | mkWiredInDataConName :: BuiltInSyntax -> Module -> FastString -> Unique -> DataCon -> Name
mkWiredInDataConName built_in modu fs unique datacon
= mkWiredInName modu (mkDataOccFS fs) unique
(AConLike (RealDataCon datacon)) -- Relevant DataCon
built_in | 291 | mkWiredInDataConName built_in modu fs unique datacon
= mkWiredInName modu (mkDataOccFS fs) unique
(AConLike (RealDataCon datacon)) -- Relevant DataCon
built_in | 200 | false | true | 0 | 9 | 72 | 72 | 36 | 36 | null | null |
tlaitinen/servant-cookie-hmac-auth-example | src/Api/PrivateAuthReqBody.hs | bsd-3-clause | authReqBodyServer :: ServerT PrivateAuthReqBodyAPI App
authReqBodyServer = postAuthData | 87 | authReqBodyServer :: ServerT PrivateAuthReqBodyAPI App
authReqBodyServer = postAuthData | 87 | authReqBodyServer = postAuthData | 32 | false | true | 0 | 5 | 7 | 16 | 8 | 8 | null | null |
TomMD/ghc | compiler/main/HscTypes.hs | bsd-3-clause | -- | Did this 'ModSummary' originate from a hs-boot file?
isBootSummary :: ModSummary -> Bool
isBootSummary ms = ms_hsc_src ms == HsBootFile | 140 | isBootSummary :: ModSummary -> Bool
isBootSummary ms = ms_hsc_src ms == HsBootFile | 82 | isBootSummary ms = ms_hsc_src ms == HsBootFile | 46 | true | true | 0 | 7 | 21 | 32 | 14 | 18 | null | null |
fmapfmapfmap/amazonka | amazonka-opsworks/gen/Network/AWS/OpsWorks/RegisterVolume.hs | mpl-2.0 | -- | The volume ID.
rvrsVolumeId :: Lens' RegisterVolumeResponse (Maybe Text)
rvrsVolumeId = lens _rvrsVolumeId (\ s a -> s{_rvrsVolumeId = a}) | 143 | rvrsVolumeId :: Lens' RegisterVolumeResponse (Maybe Text)
rvrsVolumeId = lens _rvrsVolumeId (\ s a -> s{_rvrsVolumeId = a}) | 123 | rvrsVolumeId = lens _rvrsVolumeId (\ s a -> s{_rvrsVolumeId = a}) | 65 | true | true | 0 | 9 | 21 | 46 | 25 | 21 | null | null |
markflorisson/hpack | testrepo/bytestring-0.10.4.1/tests/builder/Data/ByteString/Builder/Prim/TestUtils.hs | bsd-3-clause | hostEndian_list :: (Storable a, Bits a, Integral a) => a -> [Word8]
hostEndian_list = case byteOrder of
LittleEndian -> littleEndian_list
BigEndian -> bigEndian_list
_ -> error $
"bounded-encoding: unsupported byteorder '" ++ show byteOrder ++ "'" | 281 | hostEndian_list :: (Storable a, Bits a, Integral a) => a -> [Word8]
hostEndian_list = case byteOrder of
LittleEndian -> littleEndian_list
BigEndian -> bigEndian_list
_ -> error $
"bounded-encoding: unsupported byteorder '" ++ show byteOrder ++ "'" | 281 | hostEndian_list = case byteOrder of
LittleEndian -> littleEndian_list
BigEndian -> bigEndian_list
_ -> error $
"bounded-encoding: unsupported byteorder '" ++ show byteOrder ++ "'" | 213 | false | true | 0 | 10 | 69 | 83 | 40 | 43 | null | null |
noteed/syntactical | Text/Syntactical/Data.hs | bsd-3-clause | setPrecedence _ c = c | 21 | setPrecedence _ c = c | 21 | setPrecedence _ c = c | 21 | false | false | 0 | 5 | 4 | 11 | 5 | 6 | null | null |
fmapfmapfmap/amazonka | amazonka-ec2/gen/Network/AWS/EC2/DeleteSecurityGroup.hs | mpl-2.0 | -- | Creates a value of 'DeleteSecurityGroupResponse' with the minimum fields required to make a request.
--
deleteSecurityGroupResponse
:: DeleteSecurityGroupResponse
deleteSecurityGroupResponse = DeleteSecurityGroupResponse' | 230 | deleteSecurityGroupResponse
:: DeleteSecurityGroupResponse
deleteSecurityGroupResponse = DeleteSecurityGroupResponse' | 121 | deleteSecurityGroupResponse = DeleteSecurityGroupResponse' | 58 | true | true | 0 | 4 | 26 | 13 | 8 | 5 | null | null |
tolysz/prepare-ghcjs | spec-lts8/cabal/cabal-install/Distribution/Client/Utils.hs | bsd-3-clause | inDir (Just d) m = do
old <- getCurrentDirectory
setCurrentDirectory d
m `Exception.finally` setCurrentDirectory old
-- | Log directory change in 'make' compatible syntax | 177 | inDir (Just d) m = do
old <- getCurrentDirectory
setCurrentDirectory d
m `Exception.finally` setCurrentDirectory old
-- | Log directory change in 'make' compatible syntax | 177 | inDir (Just d) m = do
old <- getCurrentDirectory
setCurrentDirectory d
m `Exception.finally` setCurrentDirectory old
-- | Log directory change in 'make' compatible syntax | 177 | false | false | 1 | 9 | 30 | 50 | 21 | 29 | null | null |
input-output-hk/pos-haskell-prototype | wallet/src/Cardano/Wallet/Kernel/DB/Spec/Pending.hs | mit | toList :: Pending -> [(Core.TxId, Core.TxAux)]
toList = Map.toList . toMap | 74 | toList :: Pending -> [(Core.TxId, Core.TxAux)]
toList = Map.toList . toMap | 74 | toList = Map.toList . toMap | 27 | false | true | 0 | 10 | 10 | 41 | 20 | 21 | null | null |
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.