]> git.lizzy.rs Git - rust.git/blob - clippy_lints/src/misc_early.rs
Merge branch 'master' into unneeded_wildcard_pattern
[rust.git] / clippy_lints / src / misc_early.rs
1 use crate::utils::{
2     constants, snippet, snippet_opt, span_help_and_lint, span_lint, span_lint_and_sugg, span_lint_and_then,
3 };
4 use if_chain::if_chain;
5 use rustc::lint::{in_external_macro, EarlyContext, EarlyLintPass, LintArray, LintContext, LintPass};
6 use rustc::{declare_lint_pass, declare_tool_lint};
7 use rustc_data_structures::fx::FxHashMap;
8 use rustc_errors::Applicability;
9 use syntax::ast::*;
10 use syntax::source_map::Span;
11 use syntax::visit::{walk_expr, FnKind, Visitor};
12
13 declare_clippy_lint! {
14     /// **What it does:** Checks for structure field patterns bound to wildcards.
15     ///
16     /// **Why is this bad?** Using `..` instead is shorter and leaves the focus on
17     /// the fields that are actually bound.
18     ///
19     /// **Known problems:** None.
20     ///
21     /// **Example:**
22     /// ```ignore
23     /// let { a: _, b: ref b, c: _ } = ..
24     /// ```
25     pub UNNEEDED_FIELD_PATTERN,
26     style,
27     "struct fields bound to a wildcard instead of using `..`"
28 }
29
30 declare_clippy_lint! {
31     /// **What it does:** Checks for function arguments having the similar names
32     /// differing by an underscore.
33     ///
34     /// **Why is this bad?** It affects code readability.
35     ///
36     /// **Known problems:** None.
37     ///
38     /// **Example:**
39     /// ```rust
40     /// fn foo(a: i32, _a: i32) {}
41     /// ```
42     pub DUPLICATE_UNDERSCORE_ARGUMENT,
43     style,
44     "function arguments having names which only differ by an underscore"
45 }
46
47 declare_clippy_lint! {
48     /// **What it does:** Detects closures called in the same expression where they
49     /// are defined.
50     ///
51     /// **Why is this bad?** It is unnecessarily adding to the expression's
52     /// complexity.
53     ///
54     /// **Known problems:** None.
55     ///
56     /// **Example:**
57     /// ```rust,ignore
58     /// (|| 42)()
59     /// ```
60     pub REDUNDANT_CLOSURE_CALL,
61     complexity,
62     "throwaway closures called in the expression they are defined"
63 }
64
65 declare_clippy_lint! {
66     /// **What it does:** Detects expressions of the form `--x`.
67     ///
68     /// **Why is this bad?** It can mislead C/C++ programmers to think `x` was
69     /// decremented.
70     ///
71     /// **Known problems:** None.
72     ///
73     /// **Example:**
74     /// ```rust
75     /// let mut x = 3;
76     /// --x;
77     /// ```
78     pub DOUBLE_NEG,
79     style,
80     "`--x`, which is a double negation of `x` and not a pre-decrement as in C/C++"
81 }
82
83 declare_clippy_lint! {
84     /// **What it does:** Warns on hexadecimal literals with mixed-case letter
85     /// digits.
86     ///
87     /// **Why is this bad?** It looks confusing.
88     ///
89     /// **Known problems:** None.
90     ///
91     /// **Example:**
92     /// ```rust
93     /// let y = 0x1a9BAcD;
94     /// ```
95     pub MIXED_CASE_HEX_LITERALS,
96     style,
97     "hex literals whose letter digits are not consistently upper- or lowercased"
98 }
99
100 declare_clippy_lint! {
101     /// **What it does:** Warns if literal suffixes are not separated by an
102     /// underscore.
103     ///
104     /// **Why is this bad?** It is much less readable.
105     ///
106     /// **Known problems:** None.
107     ///
108     /// **Example:**
109     /// ```rust
110     /// let y = 123832i32;
111     /// ```
112     pub UNSEPARATED_LITERAL_SUFFIX,
113     pedantic,
114     "literals whose suffix is not separated by an underscore"
115 }
116
117 declare_clippy_lint! {
118     /// **What it does:** Warns if an integral constant literal starts with `0`.
119     ///
120     /// **Why is this bad?** In some languages (including the infamous C language
121     /// and most of its
122     /// family), this marks an octal constant. In Rust however, this is a decimal
123     /// constant. This could
124     /// be confusing for both the writer and a reader of the constant.
125     ///
126     /// **Known problems:** None.
127     ///
128     /// **Example:**
129     ///
130     /// In Rust:
131     /// ```rust
132     /// fn main() {
133     ///     let a = 0123;
134     ///     println!("{}", a);
135     /// }
136     /// ```
137     ///
138     /// prints `123`, while in C:
139     ///
140     /// ```c
141     /// #include <stdio.h>
142     ///
143     /// int main() {
144     ///     int a = 0123;
145     ///     printf("%d\n", a);
146     /// }
147     /// ```
148     ///
149     /// prints `83` (as `83 == 0o123` while `123 == 0o173`).
150     pub ZERO_PREFIXED_LITERAL,
151     complexity,
152     "integer literals starting with `0`"
153 }
154
155 declare_clippy_lint! {
156     /// **What it does:** Warns if a generic shadows a built-in type.
157     ///
158     /// **Why is this bad?** This gives surprising type errors.
159     ///
160     /// **Known problems:** None.
161     ///
162     /// **Example:**
163     ///
164     /// ```ignore
165     /// impl<u32> Foo<u32> {
166     ///     fn impl_func(&self) -> u32 {
167     ///         42
168     ///     }
169     /// }
170     /// ```
171     pub BUILTIN_TYPE_SHADOW,
172     style,
173     "shadowing a builtin type"
174 }
175
176 declare_clippy_lint! {
177     /// **What it does:** Checks for patterns in the form `name @ _`.
178     ///
179     /// **Why is this bad?** It's almost always more readable to just use direct
180     /// bindings.
181     ///
182     /// **Known problems:** None.
183     ///
184     /// **Example:**
185     /// ```rust
186     /// # let v = Some("abc");
187     ///
188     /// match v {
189     ///     Some(x) => (),
190     ///     y @ _ => (), // easier written as `y`,
191     /// }
192     /// ```
193     pub REDUNDANT_PATTERN,
194     style,
195     "using `name @ _` in a pattern"
196 }
197
198 declare_clippy_lint! {
199     /// **What it does:** Checks for tuple patterns with a wildcard
200     /// pattern (`_`) is next to a rest pattern (`..`).
201     ///
202     /// _NOTE_: While `_, ..` means there is at least one element left, `..`
203     /// means there are 0 or more elements left. This can make a difference
204     /// when refactoring, but shouldn't result in errors in the refactored code,
205     /// since the wildcard pattern isn't used anyway.
206     /// **Why is this bad?** The wildcard pattern is unneeded as the rest pattern
207     /// can match that element as well.
208     ///
209     /// **Known problems:** None.
210     ///
211     /// **Example:**
212     /// ```rust
213     /// # struct TupleStruct(u32, u32, u32);
214     /// # let t = TupleStruct(1, 2, 3);
215     ///
216     /// match t {
217     ///     TupleStruct(0, .., _) => (),
218     ///     _ => (),
219     /// }
220     /// ```
221     /// can be written as
222     /// ```rust
223     /// # struct TupleStruct(u32, u32, u32);
224     /// # let t = TupleStruct(1, 2, 3);
225     ///
226     /// match t {
227     ///     TupleStruct(0, ..) => (),
228     ///     _ => (),
229     /// }
230     /// ```
231     pub UNNEEDED_WILDCARD_PATTERN,
232     complexity,
233     "tuple patterns with a wildcard pattern (`_`) is next to a rest pattern (`..`)"
234 }
235
236 declare_lint_pass!(MiscEarlyLints => [
237     UNNEEDED_FIELD_PATTERN,
238     DUPLICATE_UNDERSCORE_ARGUMENT,
239     REDUNDANT_CLOSURE_CALL,
240     DOUBLE_NEG,
241     MIXED_CASE_HEX_LITERALS,
242     UNSEPARATED_LITERAL_SUFFIX,
243     ZERO_PREFIXED_LITERAL,
244     BUILTIN_TYPE_SHADOW,
245     REDUNDANT_PATTERN,
246     UNNEEDED_WILDCARD_PATTERN,
247 ]);
248
249 // Used to find `return` statements or equivalents e.g., `?`
250 struct ReturnVisitor {
251     found_return: bool,
252 }
253
254 impl ReturnVisitor {
255     fn new() -> Self {
256         Self { found_return: false }
257     }
258 }
259
260 impl<'ast> Visitor<'ast> for ReturnVisitor {
261     fn visit_expr(&mut self, ex: &'ast Expr) {
262         if let ExprKind::Ret(_) = ex.node {
263             self.found_return = true;
264         } else if let ExprKind::Try(_) = ex.node {
265             self.found_return = true;
266         }
267
268         walk_expr(self, ex)
269     }
270 }
271
272 impl EarlyLintPass for MiscEarlyLints {
273     fn check_generics(&mut self, cx: &EarlyContext<'_>, gen: &Generics) {
274         for param in &gen.params {
275             if let GenericParamKind::Type { .. } = param.kind {
276                 let name = param.ident.as_str();
277                 if constants::BUILTIN_TYPES.contains(&&*name) {
278                     span_lint(
279                         cx,
280                         BUILTIN_TYPE_SHADOW,
281                         param.ident.span,
282                         &format!("This generic shadows the built-in type `{}`", name),
283                     );
284                 }
285             }
286         }
287     }
288
289     fn check_pat(&mut self, cx: &EarlyContext<'_>, pat: &Pat) {
290         if let PatKind::Struct(ref npat, ref pfields, _) = pat.node {
291             let mut wilds = 0;
292             let type_name = npat
293                 .segments
294                 .last()
295                 .expect("A path must have at least one segment")
296                 .ident
297                 .name;
298
299             for field in pfields {
300                 if let PatKind::Wild = field.pat.node {
301                     wilds += 1;
302                 }
303             }
304             if !pfields.is_empty() && wilds == pfields.len() {
305                 span_help_and_lint(
306                     cx,
307                     UNNEEDED_FIELD_PATTERN,
308                     pat.span,
309                     "All the struct fields are matched to a wildcard pattern, consider using `..`.",
310                     &format!("Try with `{} {{ .. }}` instead", type_name),
311                 );
312                 return;
313             }
314             if wilds > 0 {
315                 let mut normal = vec![];
316
317                 for field in pfields {
318                     match field.pat.node {
319                         PatKind::Wild => {},
320                         _ => {
321                             if let Ok(n) = cx.sess().source_map().span_to_snippet(field.span) {
322                                 normal.push(n);
323                             }
324                         },
325                     }
326                 }
327                 for field in pfields {
328                     if let PatKind::Wild = field.pat.node {
329                         wilds -= 1;
330                         if wilds > 0 {
331                             span_lint(
332                                 cx,
333                                 UNNEEDED_FIELD_PATTERN,
334                                 field.span,
335                                 "You matched a field with a wildcard pattern. Consider using `..` instead",
336                             );
337                         } else {
338                             span_help_and_lint(
339                                 cx,
340                                 UNNEEDED_FIELD_PATTERN,
341                                 field.span,
342                                 "You matched a field with a wildcard pattern. Consider using `..` \
343                                  instead",
344                                 &format!("Try with `{} {{ {}, .. }}`", type_name, normal[..].join(", ")),
345                             );
346                         }
347                     }
348                 }
349             }
350         }
351
352         if let PatKind::Ident(_, ident, Some(ref right)) = pat.node {
353             if let PatKind::Wild = right.node {
354                 span_lint_and_sugg(
355                     cx,
356                     REDUNDANT_PATTERN,
357                     pat.span,
358                     &format!(
359                         "the `{} @ _` pattern can be written as just `{}`",
360                         ident.name, ident.name,
361                     ),
362                     "try",
363                     format!("{}", ident.name),
364                     Applicability::MachineApplicable,
365                 );
366             }
367         }
368
369         check_unneeded_wildcard_pattern(cx, pat);
370     }
371
372     fn check_fn(&mut self, cx: &EarlyContext<'_>, _: FnKind<'_>, decl: &FnDecl, _: Span, _: NodeId) {
373         let mut registered_names: FxHashMap<String, Span> = FxHashMap::default();
374
375         for arg in &decl.inputs {
376             if let PatKind::Ident(_, ident, None) = arg.pat.node {
377                 let arg_name = ident.to_string();
378
379                 if arg_name.starts_with('_') {
380                     if let Some(correspondence) = registered_names.get(&arg_name[1..]) {
381                         span_lint(
382                             cx,
383                             DUPLICATE_UNDERSCORE_ARGUMENT,
384                             *correspondence,
385                             &format!(
386                                 "`{}` already exists, having another argument having almost the same \
387                                  name makes code comprehension and documentation more difficult",
388                                 arg_name[1..].to_owned()
389                             ),
390                         );
391                     }
392                 } else {
393                     registered_names.insert(arg_name, arg.pat.span);
394                 }
395             }
396         }
397     }
398
399     fn check_expr(&mut self, cx: &EarlyContext<'_>, expr: &Expr) {
400         if in_external_macro(cx.sess(), expr.span) {
401             return;
402         }
403         match expr.node {
404             ExprKind::Call(ref paren, _) => {
405                 if let ExprKind::Paren(ref closure) = paren.node {
406                     if let ExprKind::Closure(_, _, _, ref decl, ref block, _) = closure.node {
407                         let mut visitor = ReturnVisitor::new();
408                         visitor.visit_expr(block);
409                         if !visitor.found_return {
410                             span_lint_and_then(
411                                 cx,
412                                 REDUNDANT_CLOSURE_CALL,
413                                 expr.span,
414                                 "Try not to call a closure in the expression where it is declared.",
415                                 |db| {
416                                     if decl.inputs.is_empty() {
417                                         let hint = snippet(cx, block.span, "..").into_owned();
418                                         db.span_suggestion(
419                                             expr.span,
420                                             "Try doing something like: ",
421                                             hint,
422                                             Applicability::MachineApplicable, // snippet
423                                         );
424                                     }
425                                 },
426                             );
427                         }
428                     }
429                 }
430             },
431             ExprKind::Unary(UnOp::Neg, ref inner) => {
432                 if let ExprKind::Unary(UnOp::Neg, _) = inner.node {
433                     span_lint(
434                         cx,
435                         DOUBLE_NEG,
436                         expr.span,
437                         "`--x` could be misinterpreted as pre-decrement by C programmers, is usually a no-op",
438                     );
439                 }
440             },
441             ExprKind::Lit(ref lit) => self.check_lit(cx, lit),
442             _ => (),
443         }
444     }
445
446     fn check_block(&mut self, cx: &EarlyContext<'_>, block: &Block) {
447         for w in block.stmts.windows(2) {
448             if_chain! {
449                 if let StmtKind::Local(ref local) = w[0].node;
450                 if let Option::Some(ref t) = local.init;
451                 if let ExprKind::Closure(..) = t.node;
452                 if let PatKind::Ident(_, ident, _) = local.pat.node;
453                 if let StmtKind::Semi(ref second) = w[1].node;
454                 if let ExprKind::Assign(_, ref call) = second.node;
455                 if let ExprKind::Call(ref closure, _) = call.node;
456                 if let ExprKind::Path(_, ref path) = closure.node;
457                 then {
458                     if ident == path.segments[0].ident {
459                         span_lint(
460                             cx,
461                             REDUNDANT_CLOSURE_CALL,
462                             second.span,
463                             "Closure called just once immediately after it was declared",
464                         );
465                     }
466                 }
467             }
468         }
469     }
470 }
471
472 impl MiscEarlyLints {
473     fn check_lit(self, cx: &EarlyContext<'_>, lit: &Lit) {
474         // We test if first character in snippet is a number, because the snippet could be an expansion
475         // from a built-in macro like `line!()` or a proc-macro like `#[wasm_bindgen]`.
476         // Note that this check also covers special case that `line!()` is eagerly expanded by compiler.
477         // See <https://github.com/rust-lang/rust-clippy/issues/4507> for a regression.
478         // FIXME: Find a better way to detect those cases.
479         let lit_snip = match snippet_opt(cx, lit.span) {
480             Some(snip) if snip.chars().next().map_or(false, |c| c.is_digit(10)) => snip,
481             _ => return,
482         };
483
484         if let LitKind::Int(value, lit_int_type) = lit.node {
485             let suffix = match lit_int_type {
486                 LitIntType::Signed(ty) => ty.ty_to_string(),
487                 LitIntType::Unsigned(ty) => ty.ty_to_string(),
488                 LitIntType::Unsuffixed => "",
489             };
490
491             let maybe_last_sep_idx = lit_snip.len() - suffix.len() - 1;
492             // Do not lint when literal is unsuffixed.
493             if !suffix.is_empty() && lit_snip.as_bytes()[maybe_last_sep_idx] != b'_' {
494                 span_lint_and_sugg(
495                     cx,
496                     UNSEPARATED_LITERAL_SUFFIX,
497                     lit.span,
498                     "integer type suffix should be separated by an underscore",
499                     "add an underscore",
500                     format!("{}_{}", &lit_snip[..=maybe_last_sep_idx], suffix),
501                     Applicability::MachineApplicable,
502                 );
503             }
504
505             if lit_snip.starts_with("0x") {
506                 let mut seen = (false, false);
507                 for ch in lit_snip.as_bytes()[2..=maybe_last_sep_idx].iter() {
508                     match ch {
509                         b'a'..=b'f' => seen.0 = true,
510                         b'A'..=b'F' => seen.1 = true,
511                         _ => {},
512                     }
513                     if seen.0 && seen.1 {
514                         span_lint(
515                             cx,
516                             MIXED_CASE_HEX_LITERALS,
517                             lit.span,
518                             "inconsistent casing in hexadecimal literal",
519                         );
520                         break;
521                     }
522                 }
523             } else if lit_snip.starts_with("0b") || lit_snip.starts_with("0o") {
524                 /* nothing to do */
525             } else if value != 0 && lit_snip.starts_with('0') {
526                 span_lint_and_then(
527                     cx,
528                     ZERO_PREFIXED_LITERAL,
529                     lit.span,
530                     "this is a decimal constant",
531                     |db| {
532                         db.span_suggestion(
533                             lit.span,
534                             "if you mean to use a decimal constant, remove the `0` to avoid confusion",
535                             lit_snip.trim_start_matches(|c| c == '_' || c == '0').to_string(),
536                             Applicability::MaybeIncorrect,
537                         );
538                         db.span_suggestion(
539                             lit.span,
540                             "if you mean to use an octal constant, use `0o`",
541                             format!("0o{}", lit_snip.trim_start_matches(|c| c == '_' || c == '0')),
542                             Applicability::MaybeIncorrect,
543                         );
544                     },
545                 );
546             }
547         } else if let LitKind::Float(_, float_ty) = lit.node {
548             let suffix = float_ty.ty_to_string();
549             let maybe_last_sep_idx = lit_snip.len() - suffix.len() - 1;
550             if lit_snip.as_bytes()[maybe_last_sep_idx] != b'_' {
551                 span_lint_and_sugg(
552                     cx,
553                     UNSEPARATED_LITERAL_SUFFIX,
554                     lit.span,
555                     "float type suffix should be separated by an underscore",
556                     "add an underscore",
557                     format!("{}_{}", &lit_snip[..=maybe_last_sep_idx], suffix),
558                     Applicability::MachineApplicable,
559                 );
560             }
561         }
562     }
563 }
564
565 fn check_unneeded_wildcard_pattern(cx: &EarlyContext<'_>, pat: &Pat) {
566     if let PatKind::TupleStruct(_, ref patterns) | PatKind::Tuple(ref patterns) = pat.node {
567         fn span_lint(cx: &EarlyContext<'_>, span: Span, only_one: bool) {
568             span_lint_and_sugg(
569                 cx,
570                 UNNEEDED_WILDCARD_PATTERN,
571                 span,
572                 if only_one {
573                     "this pattern is unneeded as the `..` pattern can match that element"
574                 } else {
575                     "these patterns are unneeded as the `..` pattern can match those elements"
576                 },
577                 if only_one { "remove it" } else { "remove them" },
578                 "".to_string(),
579                 Applicability::MachineApplicable,
580             );
581         }
582
583         #[allow(clippy::trivially_copy_pass_by_ref)]
584         fn is_wild<P: std::ops::Deref<Target = Pat>>(pat: &&P) -> bool {
585             if let PatKind::Wild = pat.node {
586                 true
587             } else {
588                 false
589             }
590         }
591
592         if let Some(rest_index) = patterns.iter().position(|pat| pat.is_rest()) {
593             if let Some((left_index, left_pat)) = patterns[..rest_index]
594                 .iter()
595                 .rev()
596                 .take_while(is_wild)
597                 .enumerate()
598                 .last()
599             {
600                 span_lint(cx, left_pat.span.until(patterns[rest_index].span), left_index == 0);
601             }
602
603             if let Some((right_index, right_pat)) =
604                 patterns[rest_index + 1..].iter().take_while(is_wild).enumerate().last()
605             {
606                 span_lint(
607                     cx,
608                     patterns[rest_index].span.shrink_to_hi().to(right_pat.span),
609                     right_index == 0,
610                 );
611             }
612         }
613     }
614 }