File tree Expand file tree Collapse file tree 4 files changed +8
-8
lines changed Expand file tree Collapse file tree 4 files changed +8
-8
lines changed Original file line number Diff line number Diff line change @@ -268,13 +268,13 @@ value = jsonWith (pure . KM.fromList)
268
268
--
269
269
-- ==== __Examples__
270
270
--
271
- -- 'json' keeps only the first occurence of each key, using 'Data.Aeson.KeyMap.fromList'.
271
+ -- 'json' keeps only the first occurrence of each key, using 'Data.Aeson.KeyMap.fromList'.
272
272
--
273
273
-- @
274
274
-- 'json' = 'jsonWith' ('Right' '.' 'H.fromList')
275
275
-- @
276
276
--
277
- -- 'jsonLast' keeps the last occurence of each key, using
277
+ -- 'jsonLast' keeps the last occurrence of each key, using
278
278
-- @'HashMap.Lazy.fromListWith' ('const' 'id')@.
279
279
--
280
280
-- @
@@ -309,7 +309,7 @@ jsonWith mkObject = fix $ \value_ -> do
309
309
| otherwise -> fail " not a valid json value"
310
310
{-# INLINE jsonWith #-}
311
311
312
- -- | Variant of 'json' which keeps only the last occurence of every key.
312
+ -- | Variant of 'json' which keeps only the last occurrence of every key.
313
313
jsonLast :: Parser Value
314
314
jsonLast = jsonWith (Right . KM. fromListWith (const id ))
315
315
@@ -365,7 +365,7 @@ jsonWith' mkObject = fix $ \value_ -> do
365
365
| otherwise -> fail " not a valid json value"
366
366
{-# INLINE jsonWith' #-}
367
367
368
- -- | Variant of 'json'' which keeps only the last occurence of every key.
368
+ -- | Variant of 'json'' which keeps only the last occurrence of every key.
369
369
jsonLast' :: Parser Value
370
370
jsonLast' = jsonWith' (pure . KM. fromListWith (const id ))
371
371
Original file line number Diff line number Diff line change @@ -464,7 +464,7 @@ instance Functor FromJSONKeyFunction where
464
464
-- are derived with generalized newtype deriving.
465
465
-- compatible with 'Text' i.e. hash values be equal for wrapped values as well.
466
466
--
467
- -- On pre GHC 7.8 this is unconstrainted function.
467
+ -- On pre GHC 7.8 this is unconstrained function.
468
468
fromJSONKeyCoerce ::
469
469
Coercible Text a =>
470
470
FromJSONKeyFunction a
@@ -557,7 +557,7 @@ typeOf v = case v of
557
557
Null -> " Null"
558
558
559
559
-------------------------------------------------------------------------------
560
- -- Lifings of FromJSON and ToJSON to unary and binary type constructors
560
+ -- Liftings of FromJSON and ToJSON to unary and binary type constructors
561
561
-------------------------------------------------------------------------------
562
562
563
563
-- | Lifting of the 'FromJSON' class to unary type constructors.
Original file line number Diff line number Diff line change @@ -564,7 +564,7 @@ class GetConName f => GToJSONKey f
564
564
instance GetConName f => GToJSONKey f
565
565
566
566
-------------------------------------------------------------------------------
567
- -- Lifings of FromJSON and ToJSON to unary and binary type constructors
567
+ -- Liftings of FromJSON and ToJSON to unary and binary type constructors
568
568
-------------------------------------------------------------------------------
569
569
570
570
Original file line number Diff line number Diff line change @@ -818,7 +818,7 @@ tests = testGroup "unit" [
818
818
, testCase " Small rational" smallRationalDecoding
819
819
, testCase " Big scientific exponent" bigScientificExponent
820
820
, testCase " Big integer decoding" bigIntegerDecoding
821
- , testCase " Big natural decading " bigNaturalDecoding
821
+ , testCase " Big natural decoding " bigNaturalDecoding
822
822
, testCase " Big integer key decoding" bigIntegerKeyDecoding
823
823
, testGroup " QQ.Simple"
824
824
[ testCase " example" $
You can’t perform that action at this time.
0 commit comments