Merging of two dataframes

Hi all,
I have two data frames with same variables. It has students name and Marks scored. I need to merge it in such a way that I get all the students together in a single data frame.
library(tidyverse)
library(janitor)
#>
#> Attaching package: 'janitor'
#> The following objects are masked from 'package:stats':
#>
#> chisq.test, fisher.test
a<-tibble::tribble(
~Student.Name, ~Marks,
"a", 12L,
"b", 45L,
"c", 23L,
"d", 65L,
"e", 67L,
"f", 90L
)

b<-tibble::tribble(
~Student.Name, ~Marks,
"p", 22L,
"q", 56L,
"r", 98L,
"w", 44L,
"t", 55L,
"u", 10L,
"v", 96L,
"z", 50L
)
Created on 2021-12-30 by the reprex package (v2.0.1)

a<-tibble::tribble(
  ~Student.Name, ~Marks,
  "a", 12L,
  "b", 45L,
  "c", 23L,
  "d", 65L,
  "e", 67L,
  "f", 90L
)

b<-tibble::tribble(
  ~Student.Name, ~Marks,
  "p", 22L,
  "q", 56L,
  "r", 98L,
  "w", 44L,
  "t", 55L,
  "u", 10L,
  "v", 96L,
  "z", 50L
)

dplyr::bind_rows(a,b)
#> # A tibble: 14 x 2
#>    Student.Name Marks
#>    <chr>        <int>
#>  1 a               12
#>  2 b               45
#>  3 c               23
#>  4 d               65
#>  5 e               67
#>  6 f               90
#>  7 p               22
#>  8 q               56
#>  9 r               98
#> 10 w               44
#> 11 t               55
#> 12 u               10
#> 13 v               96
#> 14 z               50

Created on 2021-12-30 by the reprex package (v2.0.1)

Thanks a lot. This is perfect for me