Skip to content

Commit d9b10ff

Browse files
committed
Some whitespace normalization
1 parent c19e1cb commit d9b10ff

File tree

8 files changed

+8
-15
lines changed

8 files changed

+8
-15
lines changed

Data/JSString.hs

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -62,7 +62,7 @@ module Data.JSString ( JSString
6262
, minimum
6363

6464
-- * Construction
65-
65+
6666
-- ** Scans
6767
, scanl
6868
, scanl1
@@ -205,7 +205,7 @@ instance Data JSString where
205205
gunfold k z c = case constrIndex c of
206206
1 -> k (z pack)
207207
_ -> P.error "gunfold"
208-
dataTypeOf _ = jsstringDataType
208+
dataTypeOf _ = jsstringDataType
209209

210210
packConstr :: Constr
211211
packConstr = mkConstr jsstringDataType "pack" [] Prefix
@@ -1472,7 +1472,7 @@ count pat src
14721472
-- RULES
14731473
-- "JSSTRING count/singleton -> countChar" [~1] forall c t.
14741474
-- count (singleton c) t = countChar c t
1475-
--
1475+
--
14761476

14771477
-- | /O(n)/ The 'countChar' function returns the number of times the
14781478
-- query element appears in the given 'JSString'. Subject to fusion.
@@ -1514,7 +1514,7 @@ words x = loop 0# -- js_words x {- t@(Text arr off len) = loop 0 0
15141514
words' :: JSString -> [JSString]
15151515
words' x = unsafeCoerce (js_words x)
15161516
{-# INLINE words' #-}
1517-
1517+
15181518
-- | /O(n)/ Breaks a 'JSString' up into a list of 'JSString's at
15191519
-- newline 'Char's. The resulting strings do not contain newlines.
15201520
lines :: JSString -> [JSString]
@@ -1742,7 +1742,7 @@ foreign import javascript unsafe
17421742
-- "h$jsstringGroup1" js_group1
17431743
-- :: Int# -> Bool -> JSString -> (# Int#, JSString #)
17441744
foreign import javascript unsafe
1745-
"h$jsstringConcat" js_concat :: Exts.Any {- [JSString] -} -> JSString
1745+
"h$jsstringConcat" js_concat :: Exts.Any {- [JSString] -} -> JSString
17461746
-- debug this below!
17471747
foreign import javascript unsafe
17481748
"h$jsstringReplace" js_replace :: JSString -> JSString -> JSString -> JSString

Data/JSString/Internal/Type.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -7,7 +7,7 @@ module Data.JSString.Internal.Type ( JSString(..)
77
, safe
88
, firstf
99
) where
10-
10+
1111
{-
1212
-- * Construction
1313
, text

GHCJS/Foreign.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -55,7 +55,7 @@ module GHCJS.Foreign ( jsTrue
5555
, isBoolean
5656
, isSymbol
5757
, isNumber
58-
{-
58+
{-
5959
, toArray
6060
, newArray
6161
, fromArray

GHCJS/Internal/Types.hs

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -40,5 +40,3 @@ type family Mutability (a :: MutabilityType s) :: IsItMutable where
4040
Mutability Immutable = IsImmutable
4141
Mutability Mutable = IsMutable
4242
Mutability (STMutable s) = IsMutable
43-
44-

GHCJS/Marshal.hs

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -301,5 +301,3 @@ toJSVal_aeson x = cv (AE.toJSON x)
301301
obj@(OI.Object obj') <- OI.create
302302
mapM_ (\(k,v) -> convertValue v >>= \v' -> OI.setProp (JSS.textToJSString k) v' obj) (H.toList o)
303303
return obj'
304-
305-

GHCJS/Marshal/Internal.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -70,7 +70,7 @@ class FromJSVal a where
7070

7171
fromJSValUncheckedListOf :: JSVal -> IO [a]
7272
fromJSValUncheckedListOf = mapM fromJSValUnchecked <=< Prim.fromJSArray
73-
73+
7474
-- default fromJSVal :: PFromJSVal a => JSVal a -> IO (Maybe a)
7575
-- fromJSVal x = return (Just (pFromJSVal x))
7676

GHCJS/Marshal/Pure.hs

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -151,4 +151,3 @@ foreign import javascript unsafe "$r = $1;" intToJSVal :: Int# -> JSVal
151151
foreign import javascript unsafe "$r = $1;" doubleToJSVal :: Double# -> JSVal
152152
foreign import javascript unsafe "$r = $1;" floatToJSVal :: Float# -> JSVal
153153
foreign import javascript unsafe "$r = $1;" charToJSVal :: Char# -> JSVal
154-

GHCJS/Nullable.hs

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -15,5 +15,3 @@ nullableToMaybe (Nullable r) = pFromJSVal r
1515
maybeToNullable :: PToJSVal a => Maybe a -> Nullable a
1616
maybeToNullable = Nullable . pToJSVal
1717
{-# INLINE maybeToNullable #-}
18-
19-

0 commit comments

Comments
 (0)